Skip to content

Instantly share code, notes, and snippets.

@yu-iskw
Created June 23, 2015 00:00
Show Gist options
  • Save yu-iskw/0019b37a2c1167f33986 to your computer and use it in GitHub Desktop.
Save yu-iskw/0019b37a2c1167f33986 to your computer and use it in GitHub Desktop.
The result of `lintr` after removing the trailing whitespace for SPARK-8548

Grep

> grep 'style: Trailing whitespace' ./dev/lint-r-report.log  | wc -l
0

The full result

inst/tests/test_binary_function.R:43:6: style: Put spaces around all infix operators.
  rdd<- map(text.rdd, function(x) {x})
    ~^
inst/tests/test_binary_function.R:79:12: style: Use <-, not =, for assignment.
  mockFile = c("Spark is pretty.", "Spark is awesome.")
           ^
inst/tests/test_binaryFile.R:23:10: style: Use <-, not =, for assignment.
mockFile = c("Spark is pretty.", "Spark is awesome.")
         ^
inst/tests/test_rdd.R:253:59: style: Place a space before left parenthesis, except in a function call.
  actual <- collect(flatMapValues(intRdd, function(x) { x:(x + 1) }))
                                                          ^
inst/tests/test_rdd.R:296:26: style: Put spaces around all infix operators.
  func <- function(x) { x*x }
                        ~^~
inst/tests/test_rdd.R:314:21: style: Put spaces around all infix operators.
  expect_true(count >=0 && count <= 4)
                    ^~~
inst/tests/test_rdd.R:450:12: style: Use <-, not =, for assignment.
  mockFile = c("Spark is pretty.", "Spark is awesome.")
           ^
inst/tests/test_rdd.R:486:12: style: Use <-, not =, for assignment.
  mockFile = c("Spark is pretty.", "Spark is awesome.")
           ^
inst/tests/test_rdd.R:672:1: style: lines should not be more than 100 characters.
  expected <- list(list(1, list(2, 1)), list(1, list(3, 1)), list(2, list(NULL, 4)), list(3, list(3, NULL)))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
inst/tests/test_rdd.R:678:1: style: lines should not be more than 100 characters.
  expected <- list(list("b", list(NULL, 4)), list("a", list(2, 1)), list("a", list(3, 1)), list("c", list(1, NULL)))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
inst/tests/test_rdd.R:686:1: style: lines should not be more than 100 characters.
               sortKeyValueList(list(list(1, list(1, NULL)), list(2, list(2, NULL)), list(3, list(NULL, 3)), list(4, list(NULL, 4)))))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
inst/tests/test_rdd.R:692:1: style: lines should not be more than 100 characters.
               sortKeyValueList(list(list("a", list(1, NULL)), list("b", list(2, NULL)), list("d", list(NULL, 4)), list("c", list(NULL, 3)))))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
inst/tests/test_sparkSQL.R:52:28: style: Only use double-quotes.
               list(type = 'array', elementType = "integer", containsNull = TRUE))
                           ^~~~~~~
inst/tests/test_sparkSQL.R:54:28: style: Only use double-quotes.
               list(type = 'array', elementType = "integer", containsNull = TRUE))
                           ^~~~~~~
inst/tests/test_sparkSQL.R:385:1: style: lines should not be more than 100 characters.
test_that("multiple pipeline transformations starting with a DataFrame result in an RDD with the correct values", {
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
inst/tests/test_sparkSQL.R:570:3: style: Closing curly-braces should always be on their own line, unless it's followed by an else.
  }, error = function(err) {
  ^
inst/tests/test_sparkSQL.R:620:80: style: Put spaces around all infix operators.
  expect_equal(collect(select(df, hypot(df$a, df$b)))[1, "HYPOT(a, b)"], sqrt(1^2 + 5^2))
                                                                              ~^~
inst/tests/test_sparkSQL.R:620:86: style: Put spaces around all infix operators.
  expect_equal(collect(select(df, hypot(df$a, df$b)))[1, "HYPOT(a, b)"], sqrt(1^2 + 5^2))
                                                                                    ~^~
inst/tests/test_sparkSQL.R:621:80: style: Put spaces around all infix operators.
  expect_equal(collect(select(df, hypot(df$a, df$b)))[2, "HYPOT(a, b)"], sqrt(2^2 + 6^2))
                                                                              ~^~
inst/tests/test_sparkSQL.R:621:86: style: Put spaces around all infix operators.
  expect_equal(collect(select(df, hypot(df$a, df$b)))[2, "HYPOT(a, b)"], sqrt(2^2 + 6^2))
                                                                                    ~^~
inst/tests/test_sparkSQL.R:622:80: style: Put spaces around all infix operators.
  expect_equal(collect(select(df, hypot(df$a, df$b)))[3, "HYPOT(a, b)"], sqrt(3^2 + 7^2))
                                                                              ~^~
inst/tests/test_sparkSQL.R:622:86: style: Put spaces around all infix operators.
  expect_equal(collect(select(df, hypot(df$a, df$b)))[3, "HYPOT(a, b)"], sqrt(3^2 + 7^2))
                                                                                    ~^~
inst/tests/test_sparkSQL.R:623:80: style: Put spaces around all infix operators.
  expect_equal(collect(select(df, hypot(df$a, df$b)))[4, "HYPOT(a, b)"], sqrt(4^2 + 8^2))
                                                                              ~^~
inst/tests/test_sparkSQL.R:623:86: style: Put spaces around all infix operators.
  expect_equal(collect(select(df, hypot(df$a, df$b)))[4, "HYPOT(a, b)"], sqrt(4^2 + 8^2))
                                                                                    ~^~
inst/tests/test_sparkSQL.R:740:1: style: lines should not be more than 100 characters.
  expect_output(s , "+----+-------+\n| age|   name|\n+----+-------+\n|null|Michael|\n|  30|   Andy|\n|  19| Justin|\n+----+-------+\n")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
inst/tests/test_sparkSQL.R:813:44: style: Put spaces around all infix operators.
  expect_true(count(parquetDF) == count(df)*2)
                                          ~^~
inst/tests/test_textFile.R:23:10: style: Use <-, not =, for assignment.
mockFile = c("Spark is pretty.", "Spark is awesome.")
         ^
inst/tests/test_utils.R:122:5: style: Use <-, not =, for assignment.
  t = 4  # Override base::t in .GlobalEnv.
    ^
R/backend.R:24:10: warning: no visible global function definition for ‘callJStatic’
  cls <- callJStatic("java.lang.Class", "forName", className)
         ^~~~~~~~~~~
R/backend.R:25:3: warning: no visible global function definition for ‘callJMethod’
  callJMethod(cls, "isInstance", jobj)
  ^~~~~~~~~~~
R/backend.R:37:3: warning: no visible global function definition for ‘invokeJava’
  invokeJava(isStatic = FALSE, objId$id, methodName, ...)
  ^~~~~~~~~~
R/backend.R:42:3: warning: no visible global function definition for ‘invokeJava’
  invokeJava(isStatic = TRUE, className, methodName, ...)
  ^~~~~~~~~~
R/backend.R:47:3: warning: no visible global function definition for ‘invokeJava’
  invokeJava(isStatic = TRUE, className, methodName = "<init>", ...)
  ^~~~~~~~~~
R/backend.R:53:3: warning: no visible global function definition for ‘invokeJava’
  invokeJava(isStatic = TRUE, "SparkRHandler", "rm", objId)
  ^~~~~~~~~~
R/backend.R:76:24: warning: no visible binding for global variable ‘.toRemoveJobjs’
    objsToRemove <- ls(.toRemoveJobjs)
                       ^~~~~~~~~~~~~~
R/backend.R:80:15: warning: no visible global function definition for ‘removeJObject’
              removeJObject(e)
              ^~~~~~~~~~~~~
R/backend.R:82:39: warning: no visible binding for global variable ‘.toRemoveJobjs’
      rm(list = objsToRemove, envir = .toRemoveJobjs)
                                      ^~~~~~~~~~~~~~
R/backend.R:89:3: warning: no visible global function definition for ‘writeBoolean’
  writeBoolean(rc, isStatic)
  ^~~~~~~~~~~~
R/backend.R:90:3: warning: no visible global function definition for ‘writeString’
  writeString(rc, objId)
  ^~~~~~~~~~~
R/backend.R:91:3: warning: no visible global function definition for ‘writeString’
  writeString(rc, methodName)
  ^~~~~~~~~~~
R/backend.R:94:3: warning: no visible global function definition for ‘writeInt’
  writeInt(rc, length(args))
  ^~~~~~~~
R/backend.R:95:3: warning: no visible global function definition for ‘writeArgs’
  writeArgs(rc, args)
  ^~~~~~~~~
R/backend.R:103:3: warning: no visible global function definition for ‘writeInt’
  writeInt(rc, length(bytesToSend))
  ^~~~~~~~
R/backend.R:108:29: warning: no visible binding for global variable ‘.sparkREnv’
  conn <- get(".sparkRCon", .sparkREnv)
                            ^~~~~~~~~~
R/backend.R:112:19: warning: no visible global function definition for ‘readInt’
  returnStatus <- readInt(conn)
                  ^~~~~~~
R/backend.R:114:3: warning: no visible global function definition for ‘readObject’
  readObject(conn)
  ^~~~~~~~~~
R/broadcast.R:45:3: warning: no visible global function definition for ‘new’, Did you mean 'news'?
  new("Broadcast", id = id)
  ^~~
R/broadcast.R:84:16: warning: no visible binding for global variable ‘.broadcastNames’
  bcasts <- ls(.broadcastNames)
               ^~~~~~~~~~~~~~~
R/broadcast.R:85:29: warning: no visible binding for global variable ‘.broadcastNames’
  rm(list = bcasts, envir = .broadcastNames)
                            ^~~~~~~~~~~~~~~
R/client.R:26:40: warning: no visible binding for global variable ‘.sparkREnv’
      return(get(".sparkRcon", envir = .sparkREnv))
                                       ^~~~~~~~~~
R/client.R:33:37: warning: no visible binding for global variable ‘.sparkREnv’
  assign(".sparkRCon", con, envir = .sparkREnv)
                                    ^~~~~~~~~~
R/client.R:39:24: style: Use <-, not =, for assignment.
    sparkSubmitBinName = "spark-submit"
                       ^
R/client.R:41:24: style: Use <-, not =, for assignment.
    sparkSubmitBinName = "spark-submit.cmd"
                       ^
R/column.R:41:3: warning: no visible global function definition for ‘new’, Did you mean 'news'?
  new("Column", jc)
  ^~~
R/column.R:45:3: warning: no visible global function definition for ‘column’, Did you mean 'colSums'?
  column(callJStatic("org.apache.spark.sql.functions", "col", x))
  ^~~~~~
R/column.R:45:10: warning: no visible global function definition for ‘callJStatic’
  column(callJStatic("org.apache.spark.sql.functions", "col", x))
         ^~~~~~~~~~~
R/column.R:68:21: style: Put spaces around all infix operators.
binary_mathfunctions<- c("atan2", "hypot")
                   ~^
R/column.R:76:19: warning: no visible global function definition for ‘callJMethod’
                  callJMethod(e1@jc, "unary_$minus")
                  ^~~~~~~~~~~
R/column.R:78:19: warning: no visible global function definition for ‘callJMethod’
                  callJMethod(e1@jc, operators[[op]])
                  ^~~~~~~~~~~
R/column.R:78:38: warning: no visible binding for global variable ‘operators’
                  callJMethod(e1@jc, operators[[op]])
                                     ^~~~~~~~~
R/column.R:85:25: warning: no visible global function definition for ‘callJStatic’
                  jc <- callJStatic("org.apache.spark.sql.functions", operators[[op]], e1@jc, e2)
                        ^~~~~~~~~~~
R/column.R:85:71: warning: no visible binding for global variable ‘operators’
                  jc <- callJStatic("org.apache.spark.sql.functions", operators[[op]], e1@jc, e2)
                                                                      ^~~~~~~~~
R/column.R:87:19: warning: no visible global function definition for ‘callJMethod’
                  callJMethod(e1@jc, operators[[op]], e2)
                  ^~~~~~~~~~~
R/column.R:87:38: warning: no visible binding for global variable ‘operators’
                  callJMethod(e1@jc, operators[[op]], e2)
                                     ^~~~~~~~~
R/column.R:90:15: warning: no visible global function definition for ‘column’, Did you mean 'colSums'?
              column(jc)
              ^~~~~~
R/column.R:98:15: warning: no visible global function definition for ‘column’, Did you mean 'colSums'?
              column(callJMethod(x@jc, name))
              ^~~~~~
R/column.R:98:22: warning: no visible global function definition for ‘callJMethod’
              column(callJMethod(x@jc, name))
                     ^~~~~~~~~~~
R/column.R:109:21: warning: no visible global function definition for ‘callJMethod’
              jc <- callJMethod(x@jc, name, data)
                    ^~~~~~~~~~~
R/column.R:110:15: warning: no visible global function definition for ‘column’, Did you mean 'colSums'?
              column(jc)
              ^~~~~~
R/column.R:124:21: warning: no visible global function definition for ‘callJStatic’
              jc <- callJStatic("org.apache.spark.sql.functions", name, x@jc)
                    ^~~~~~~~~~~
R/column.R:125:15: warning: no visible global function definition for ‘column’, Did you mean 'colSums'?
              column(jc)
              ^~~~~~
R/column.R:136:21: warning: no visible global function definition for ‘callJStatic’
              jc <- callJStatic("org.apache.spark.sql.functions", name, y@jc, x)
                    ^~~~~~~~~~~
R/column.R:137:15: warning: no visible global function definition for ‘column’, Did you mean 'colSums'?
              column(jc)
              ^~~~~~
R/column.R:143:5: warning: no visible global function definition for ‘createOperator’
    createOperator(op)
    ^~~~~~~~~~~~~~
R/column.R:146:5: warning: no visible global function definition for ‘createColumnFunction1’
    createColumnFunction1(name)
    ^~~~~~~~~~~~~~~~~~~~~
R/column.R:149:5: warning: no visible global function definition for ‘createColumnFunction2’
    createColumnFunction2(name)
    ^~~~~~~~~~~~~~~~~~~~~
R/column.R:152:5: warning: no visible global function definition for ‘createStaticFunction’
    createStaticFunction(x)
    ^~~~~~~~~~~~~~~~~~~~
R/column.R:155:5: warning: no visible global function definition for ‘createBinaryMathfunctions’
    createBinaryMathfunctions(name)
    ^~~~~~~~~~~~~~~~~~~~~~~~~
R/context.R:22:27: warning: no visible global function definition for ‘callJMethod’
    defaultParallelism <- callJMethod(sc, "defaultParallelism")
                          ^~~~~~~~~~~
R/context.R:51:11: warning: no visible global function definition for ‘callJMethod’
  jrdd <- callJMethod(sc, "textFile", path, getMinPartitions(sc, minPartitions))
          ^~~~~~~~~~~
R/context.R:51:45: warning: no visible global function definition for ‘getMinPartitions’
  jrdd <- callJMethod(sc, "textFile", path, getMinPartitions(sc, minPartitions))
                                            ^~~~~~~~~~~~~~~~
R/context.R:53:3: warning: no visible global function definition for ‘RDD’, Did you mean 'D'?
  RDD(jrdd, "string")
  ^~~
R/context.R:79:11: warning: no visible global function definition for ‘callJMethod’
  jrdd <- callJMethod(sc, "objectFile", path, getMinPartitions(sc, minPartitions))
          ^~~~~~~~~~~
R/context.R:79:47: warning: no visible global function definition for ‘getMinPartitions’
  jrdd <- callJMethod(sc, "objectFile", path, getMinPartitions(sc, minPartitions))
                                              ^~~~~~~~~~~~~~~~
R/context.R:81:3: warning: no visible global function definition for ‘RDD’, Did you mean 'D'?
  RDD(jrdd, "byte")
  ^~~
R/context.R:124:31: style: Place a space before left parenthesis, except in a function call.
  slices <- split(coll, rep(1:(numSlices + 1), each = sliceLen)[1:length(coll)])
                              ^
R/context.R:133:3: warning: no visible global function definition for ‘RDD’, Did you mean 'D'?
  RDD(jrdd, "byte")
  ^~~
R/context.R:202:17: warning: no visible global function definition for ‘callJMethod’
  jBroadcast <- callJMethod(sc, "broadcast", serializedObj)
                ^~~~~~~~~~~
R/context.R:203:22: warning: no visible global function definition for ‘callJMethod’
  id <- as.character(callJMethod(jBroadcast, "id"))
                     ^~~~~~~~~~~
R/context.R:205:3: warning: no visible global function definition for ‘Broadcast’, Did you mean 'jBroadcast'?
  Broadcast(id, object, jBroadcast, objName)
  ^~~~~~~~~
R/context.R:224:13: warning: no visible global function definition for ‘callJMethod’
  invisible(callJMethod(sc, "setCheckpointDir", suppressWarnings(normalizePath(dirName))))
            ^~~~~~~~~~~
R/DataFrame.R:52:3: warning: no visible global function definition for ‘new’, Did you mean 'news'?
  new("DataFrame", sdf, isCached)
  ^~~
R/DataFrame.R:815:3: warning: no visible global function definition for ‘column’, Did you mean 'colSums'?
  column(callJMethod(x@sdf, "col", c))
  ^~~~~~
R/DataFrame.R:815:10: warning: no visible global function definition for ‘callJMethod’
  column(callJMethod(x@sdf, "col", c))
         ^~~~~~~~~~~
R/DataFrame.R:1317:46: style: Only use double-quotes.
          signature(df = "DataFrame", path = 'character'),
                                             ^~~~~~~~~~~
R/DataFrame.R:1325:18: style: Place a space before left parenthesis, except in a function call.
            if (!(mode %in% allModes)) {
                 ^
R/DataFrame.R:1331:26: style: Only use double-quotes.
                options[['path']] = path
                         ^~~~~~
R/DataFrame.R:1331:35: style: Use <-, not =, for assignment.
                options[['path']] = path
                                  ^
R/DataFrame.R:1340:46: style: Only use double-quotes.
          signature(df = "DataFrame", path = 'character'),
                                             ^~~~~~~~~~~
R/DataFrame.R:1378:51: style: Only use double-quotes.
          signature(df = "DataFrame", tableName = 'character', source = 'character',
                                                  ^~~~~~~~~~~
R/DataFrame.R:1378:73: style: Only use double-quotes.
          signature(df = "DataFrame", tableName = 'character', source = 'character',
                                                                        ^~~~~~~~~~~
R/DataFrame.R:1379:28: style: Only use double-quotes.
                    mode = 'character'),
                           ^~~~~~~~~~~
R/DataFrame.R:1387:18: style: Place a space before left parenthesis, except in a function call.
            if (!(mode %in% allModes)) {
                 ^
R/deserialize.R:37:11: warning: no visible global function definition for ‘readType’
  type <- readType(con)
          ^~~~~~~~
R/deserialize.R:38:3: warning: no visible global function definition for ‘readTypedObject’
  readTypedObject(con, type)
  ^~~~~~~~~~~~~~~
R/deserialize.R:57:16: warning: no visible global function definition for ‘readInt’
  stringLen <- readInt(con)
               ^~~~~~~
R/deserialize.R:71:14: warning: no visible global function definition for ‘readInt’
  as.logical(readInt(con))
             ^~~~~~~
R/deserialize.R:79:11: warning: no visible global function definition for ‘readString’
  as.Date(readString(con))
          ^~~~~~~~~~
R/deserialize.R:83:8: warning: no visible global function definition for ‘readDouble’
  t <- readDouble(con)
       ^~~~~~~~~~
R/deserialize.R:89:11: warning: no visible global function definition for ‘readType’
  type <- readType(con)
          ^~~~~~~~
R/deserialize.R:90:10: warning: no visible global function definition for ‘readInt’
  len <- readInt(con)
         ^~~~~~~
R/deserialize.R:94:17: warning: no visible global function definition for ‘readTypedObject’
      l[[i]] <- readTypedObject(con, type)
                ^~~~~~~~~~~~~~~
R/deserialize.R:103:14: warning: no visible global function definition for ‘readInt’
  dataLen <- readInt(con)
             ^~~~~~~
R/deserialize.R:104:3: warning: local variable ‘data’ assigned but may not be used
  data <- readBin(con, raw(), as.integer(dataLen), endian = "big")
  ^~~~
R/deserialize.R:108:3: warning: local variable ‘data’ assigned but may not be used
  data <- readBin(con, raw(), as.integer(dataLen), endian = "big")
  ^~~~
R/deserialize.R:115:14: warning: no visible global function definition for ‘readInt’
  dataLen <- readInt(con)
             ^~~~~~~
R/deserialize.R:120:14: warning: no visible global function definition for ‘readInt’
  dataLen <- readInt(con)
             ^~~~~~~
R/deserialize.R:126:18: warning: no visible global function definition for ‘readInt’
      dataLen <- readInt(con)
                 ^~~~~~~
R/deserialize.R:141:12: warning: no visible global function definition for ‘readRow’, Did you mean 'readRDS'?
    row <- readRow(inputCon)
           ^~~~~~~
R/deserialize.R:157:3: warning: no visible global function definition for ‘readRow’, Did you mean 'readRDS'?
  readRow(rawObj)
  ^~~~~~~
R/deserialize.R:161:14: warning: no visible global function definition for ‘readInt’
  numCols <- readInt(inputCon)
             ^~~~~~~
R/deserialize.R:164:14: warning: no visible global function definition for ‘readObject’
      obj <- readObject(inputCon)
             ^~~~~~~~~~
R/deserialize.R:180:14: warning: no visible global function definition for ‘readObject’
    value <- readObject(inputCon)
             ^~~~~~~~~~
R/generics.R:23:1: style: lines should not be more than 100 characters.
setGeneric("aggregateRDD", function(x, zeroValue, seqOp, combOp) { standardGeneric("aggregateRDD") })
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/generics.R:253:35: style: Closing curly-braces should always be on their own line, unless it's followed by an else.
  standardGeneric("intersection") })
                                  ^
R/generics.R:552:40: style: Closing curly-braces should always be on their own line, unless it's followed by an else.
  standardGeneric("withColumnRenamed") })
                                       ^
R/group.R:42:3: warning: no visible global function definition for ‘new’, Did you mean 'news'?
  new("GroupedData", sgd)
  ^~~
R/group.R:90:18: style: Use <-, not =, for assignment.
            cols = list(...)
                 ^
R/group.R:100:31: style: Use <-, not =, for assignment.
                    cols[[n]] = alias(cols[[n]], n)
                              ^
R/group.R:127:22: warning: no visible global function definition for ‘callJMethod’
              sdf <- callJMethod(x@sgd, name, toSeq(...))
                     ^~~~~~~~~~~
R/group.R:127:47: warning: no visible global function definition for ‘toSeq’
              sdf <- callJMethod(x@sgd, name, toSeq(...))
                                              ^~~~~
R/group.R:128:15: warning: no visible global function definition for ‘dataFrame’, Did you mean 'data.frame'?
              dataFrame(sdf)
              ^~~~~~~~~
R/group.R:134:5: warning: no visible global function definition for ‘createMethod’
    createMethod(name)
    ^~~~~~~~~~~~
R/jobj.R:34:47: warning: no visible binding for global variable ‘.sparkREnv’
    jobj$appId == get(".scStartTime", envir = .sparkREnv)
                                              ^~~~~~~~~~
R/jobj.R:41:13: warning: no visible global function definition for ‘jobj’, Did you mean 'nobs'?
  newObj <- jobj(objId)
            ^~~~
R/jobj.R:59:44: warning: no visible binding for global variable ‘.sparkREnv’
  obj$appId <- get(".scStartTime", envir = .sparkREnv)
                                           ^~~~~~~~~~
R/jobj.R:63:22: warning: no visible binding for global variable ‘cleanup.jobj’
  reg.finalizer(obj, cleanup.jobj)
                     ^~~~~~~~~~~~
R/jobj.R:75:10: warning: no visible global function definition for ‘callJMethod’
  cls <- callJMethod(x, "getClass")
         ^~~~~~~~~~~
R/jobj.R:76:11: warning: no visible global function definition for ‘callJMethod’
  name <- callJMethod(cls, "getName")
          ^~~~~~~~~~~
R/jobj.R:99:15: warning: no visible binding for global variable ‘.validJobjs’
  valid <- ls(.validJobjs)
              ^~~~~~~~~~~
R/jobj.R:100:28: warning: no visible binding for global variable ‘.validJobjs’
  rm(list = valid, envir = .validJobjs)
                           ^~~~~~~~~~~
R/jobj.R:102:20: warning: no visible binding for global variable ‘.toRemoveJobjs’
  removeList <- ls(.toRemoveJobjs)
                   ^~~~~~~~~~~~~~
R/jobj.R:103:33: warning: no visible binding for global variable ‘.toRemoveJobjs’
  rm(list = removeList, envir = .toRemoveJobjs)
                                ^~~~~~~~~~~~~~
R/pairRDD.R:206:63: style: Closing curly-braces should always be on their own line, unless it's followed by an else.
                                   get(name, .broadcastNames) })
                                                              ^
R/pairRDD.R:883:27: style: Place a space before left parenthesis, except in a function call.
                      res[(len + 1):(len + count)] <- rep(list(elem), count)
                          ^
R/pairRDD.R:883:37: style: Place a space before left parenthesis, except in a function call.
                      res[(len + 1):(len + count)] <- rep(list(elem), count)
                                    ^
R/RDD.R:88:6: style: Place a space before left parenthesis, except in a function call.
    !(e$isCached || e$isCheckpointed)
     ^
R/RDD.R:100:32: style: Place a space before left parenthesis, except in a function call.
      func(partIndex, prev@func(partIndex, part))
                               ^
R/RDD.R:121:3: warning: no visible global function definition for ‘new’, Did you mean 'news'?
  new("RDD", jrdd, serializedMode, isCached, isCheckpointed)
  ^~~
R/RDD.R:125:3: warning: no visible global function definition for ‘new’, Did you mean 'news'?
  new("PipelinedRDD", prev, func, NULL)
  ^~~
R/RDD.R:846:25: style: Place a space before left parenthesis, except in a function call.
                    res[(len + 1):(len + count)] <- rep(list(elem), count)
                        ^
R/RDD.R:846:35: style: Place a space before left parenthesis, except in a function call.
                    res[(len + 1):(len + count)] <- rep(list(elem), count)
                                  ^
R/RDD.R:1108:13: warning: no visible global function definition for ‘mapPartitions’
  newRdd <- mapPartitions(x, partitionFunc)
            ^~~~~~~~~~~~~
R/RDD.R:1112:11: warning: no visible global function definition for ‘getJRDD’
  jrdd <- getJRDD(newRdd)
          ^~~~~~~
R/RDD.R:1114:24: warning: no visible global function definition for ‘getSerializedMode’
  serializedModeRDD <- getSerializedMode(newRdd)
                       ^~~~~~~~~~~~~~~~~
R/RDD.R:1126:21: warning: no visible global function definition for ‘callJMethod’
    partitionArr <- callJMethod(jrdd, "collectPartitions", as.list(as.integer(index)))
                    ^~~~~~~~~~~
R/RDD.R:1266:15: style: Words within variable and function names should be separated by '_' rather than '.'.
              trim.trailing.func <- function(x) {
              ^~~~~~~~~~~~~~~~~~
R/RDD.R:1269:44: style: Words within variable and function names should be separated by '_' rather than '.'.
              input <- unlist(lapply(part, trim.trailing.func))
                                           ^~~~~~~~~~~~~~~~~~
R/RDD.R:1271:27: style: Words within variable and function names should be separated by '_' rather than '.'.
              lapply(res, trim.trailing.func)
                          ^~~~~~~~~~~~~~~~~~
R/schema.R:45:37: warning: no visible global function definition for ‘callJMethod’
  obj$fields <- function() { lapply(callJMethod(obj$jobj, "fields"), structField) }
                                    ^~~~~~~~~~~
R/schema.R:45:70: warning: no visible binding for global variable ‘structField’
  obj$fields <- function() { lapply(callJMethod(obj$jobj, "fields"), structField) }
                                                                     ^~~~~~~~~~~
R/schema.R:60:3: warning: no visible global function definition for ‘structType’
  structType(stObj)
  ^~~~~~~~~~
R/schema.R:72:42: style: Opening curly braces should never go on their own line and should always be followed by a new line.
      sapply(x$fields(), function(field) { paste("|-", "name = \"", field$name(),
                                         ^
R/schema.R:75:54: style: Closing curly-braces should always be on their own line, unless it's followed by an else.
                                           sep = "") })
                                                     ^
R/schema.R:106:28: warning: no visible global function definition for ‘callJMethod’
  obj$name <- function() { callJMethod(x, "name") }
                           ^~~~~~~~~~~
R/schema.R:107:32: warning: no visible global function definition for ‘callJMethod’
  obj$dataType <- function() { callJMethod(x, "dataType") }
                               ^~~~~~~~~~~
R/schema.R:108:41: warning: no visible global function definition for ‘callJMethod’
  obj$dataType.toString <- function() { callJMethod(obj$dataType(), "toString") }
                                        ^~~~~~~~~~~
R/schema.R:109:45: warning: no visible global function definition for ‘callJMethod’
  obj$dataType.simpleString <- function() { callJMethod(obj$dataType(), "simpleString") }
                                            ^~~~~~~~~~~
R/schema.R:110:32: warning: no visible global function definition for ‘callJMethod’
  obj$nullable <- function() { callJMethod(x, "nullable") }
                               ^~~~~~~~~~~
R/schema.R:146:3: warning: no visible global function definition for ‘structField’
  structField(sfObj)
  ^~~~~~~~~~~
R/serialize.R:76:3: warning: no visible global function definition for ‘writeString’
  writeString(con, value$id)
  ^~~~~~~~~~~
R/serialize.R:81:3: warning: no visible global function definition for ‘writeInt’
  writeInt(con, as.integer(nchar(utfVal, type = "bytes") + 1))
  ^~~~~~~~
R/serialize.R:95:3: warning: no visible global function definition for ‘writeInt’
  writeInt(con, as.integer(value))
  ^~~~~~~~
R/serialize.R:100:3: warning: no visible global function definition for ‘writeRaw’
  writeRaw(outputCon, outputSer)
  ^~~~~~~~
R/serialize.R:105:14: warning: no visible global function definition for ‘serializeRow’
    bytes <- serializeRow(r)
             ^~~~~~~~~~~~
R/serialize.R:106:5: warning: no visible global function definition for ‘writeRaw’
    writeRaw(outputCon, bytes)
    ^~~~~~~~
R/serialize.R:113:3: warning: no visible global function definition for ‘writeRow’
  writeRow(rawObj, row)
  ^~~~~~~~
R/serialize.R:119:3: warning: no visible global function definition for ‘writeInt’
  writeInt(con, numCols)
  ^~~~~~~~
R/serialize.R:121:5: warning: no visible global function definition for ‘writeObject’
    writeObject(con, row[[i]])
    ^~~~~~~~~~~
R/serialize.R:126:3: warning: no visible global function definition for ‘writeInt’
  writeInt(con, length(batch))
  ^~~~~~~~
R/serialize.R:143:28: style: Only use double-quotes.
                 POSIXlt = 't',
                           ^~~
R/serialize.R:144:28: style: Only use double-quotes.
                 POSIXct = 't',
                           ^~~
R/serialize.R:161:3: warning: no visible global function definition for ‘writeType’
  writeType(con, elemType)
  ^~~~~~~~~
R/serialize.R:162:3: warning: no visible global function definition for ‘writeInt’
  writeInt(con, length(arr))
  ^~~~~~~~
R/serialize.R:166:7: warning: no visible global function definition for ‘writeObject’
      writeObject(con, a, FALSE)
      ^~~~~~~~~~~
R/serialize.R:173:3: warning: no visible global function definition for ‘writeInt’
  writeInt(con, length(list))
  ^~~~~~~~
R/serialize.R:175:5: warning: no visible global function definition for ‘writeObject’
    writeObject(con, elem)
    ^~~~~~~~~~~
R/serialize.R:183:3: warning: no visible global function definition for ‘writeInt’
  writeInt(con, len)
  ^~~~~~~~
R/serialize.R:185:5: warning: no visible global function definition for ‘writeList’
    writeList(con, as.list(ls(env)))
    ^~~~~~~~~
R/serialize.R:187:5: warning: no visible global function definition for ‘writeGenericList’
    writeGenericList(con, as.list(vals))
    ^~~~~~~~~~~~~~~~
R/serialize.R:192:3: warning: no visible global function definition for ‘writeString’
  writeString(con, as.character(date))
  ^~~~~~~~~~~
R/serialize.R:196:3: warning: no visible global function definition for ‘writeDouble’
  writeDouble(con, as.double(time))
  ^~~~~~~~~~~
R/serialize.R:205:7: warning: no visible global function definition for ‘writeObject’
      writeObject(con, a)
      ^~~~~~~~~~~
R/sparkR.R:29:3: style: Closing curly-braces should always be on their own line, unless it's followed by an else.
  }, error = function(err) {
  ^
R/sparkR.R:38:10: warning: no visible binding for global variable ‘.sparkREnv’
  env <- .sparkREnv
         ^~~~~~~~~~
R/sparkR.R:43:7: warning: no visible global function definition for ‘callJMethod’
      callJMethod(sc, "stop")
      ^~~~~~~~~~~
R/sparkR.R:48:7: warning: no visible global function definition for ‘callJStatic’
      callJStatic("SparkRHandler", "stopBackend")
      ^~~~~~~~~~~
R/sparkR.R:67:3: warning: no visible global function definition for ‘clearBroadcastVariables’
  clearBroadcastVariables()
  ^~~~~~~~~~~~~~~~~~~~~~~
R/sparkR.R:70:3: warning: no visible global function definition for ‘clearJobjs’
  clearJobjs()
  ^~~~~~~~~~
R/sparkR.R:106:1: style: lines should not be more than 100 characters.
    cat("Re-using existing Spark Context. Please stop SparkR with sparkR.stop() or restart R to create a new Spark Context\n")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/sparkR.R:110:3: warning: local variable ‘sparkMem’ assigned but may not be used
  sparkMem <- Sys.getenv("SPARK_MEM", "512m")
  ^~~~~~~~
R/sparkR.R:116:5: warning: local variable ‘collapseChar’ assigned but may not be used
    collapseChar <- ":"
    ^~~~~~~~~~~~
R/sparkR.R:145:26: style: Only use double-quotes.
    f <- file(path, open='rb')
                         ^~~~
R/sparkR.R:146:20: warning: no visible global function definition for ‘readInt’
    backendPort <- readInt(f)
                   ^~~~~~~
R/sparkR.R:147:20: warning: no visible global function definition for ‘readInt’
    monitorPort <- readInt(f)
                   ^~~~~~~
R/sparkR.R:160:5: warning: no visible global function definition for ‘connectBackend’
    connectBackend("localhost", backendPort)
    ^~~~~~~~~~~~~~
R/sparkR.R:161:3: style: Closing curly-braces should always be on their own line, unless it's followed by an else.
  }, error = function(err) {
  ^
R/sparkR.R:180:1: style: lines should not be more than 100 characters.
    sparkExecutorEnvMap[["LD_LIBRARY_PATH"]] <- paste0("$LD_LIBRARY_PATH:",Sys.getenv("LD_LIBRARY_PATH"))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/sparkR.R:187:1: style: lines should not be more than 100 characters.
  localJarPaths <- sapply(nonEmptyJars, function(j) { utils::URLencode(paste("file:", uriSep, j, sep = "")) })
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/sparkR.R:230:40: warning: no visible binding for global variable ‘.sparkREnv’
    return(get(".sparkRSQLsc", envir = .sparkREnv))
                                       ^~~~~~~~~~
R/sparkR.R:235:5: warning: no visible global function definition for ‘sparkR.init’
    sparkR.init()
    ^~~~~~~~~~~
R/sparkR.R:243:46: warning: no visible binding for global variable ‘.sparkREnv’
  assign(".sparkRSQLsc", sqlContext, envir = .sparkREnv)
                                             ^~~~~~~~~~
R/sparkR.R:261:41: warning: no visible binding for global variable ‘.sparkREnv’
    return(get(".sparkRHivesc", envir = .sparkREnv))
                                        ^~~~~~~~~~
R/sparkR.R:266:5: warning: no visible global function definition for ‘sparkR.init’
    sparkR.init()
    ^~~~~~~~~~~
R/sparkR.R:271:10: warning: no visible global function definition for ‘callJMethod’
  ssc <- callJMethod(sc, "sc")
         ^~~~~~~~~~~
R/sparkR.R:273:5: warning: no visible global function definition for ‘newJObject’
    newJObject("org.apache.spark.sql.hive.HiveContext", ssc)
    ^~~~~~~~~~
R/sparkR.R:274:3: style: Closing curly-braces should always be on their own line, unless it's followed by an else.
  }, error = function(err) {
  ^
R/sparkR.R:278:44: warning: no visible binding for global variable ‘.sparkREnv’
  assign(".sparkRHivesc", hiveCtx, envir = .sparkREnv)
                                           ^~~~~~~~~~
R/sparkR.R:296:3: warning: no visible global function definition for ‘callJMethod’
  callJMethod(sc, "setJobGroup", groupId, description, interruptOnCancel)
  ^~~~~~~~~~~
R/sparkR.R:309:3: warning: no visible global function definition for ‘callJMethod’
  callJMethod(sc, "clearJobGroup")
  ^~~~~~~~~~~
R/sparkR.R:323:3: warning: no visible global function definition for ‘callJMethod’
  callJMethod(sc, "cancelJobGroup", groupId)
  ^~~~~~~~~~~
R/SQLContext.R:57:9: warning: no visible global function definition for ‘structField’
        structField(names[[i]], types[[i]], TRUE)
        ^~~~~~~~~~~
R/SQLContext.R:59:15: warning: no visible binding for global variable ‘structType’
      do.call(structType, fields)
              ^~~~~~~~~~
R/SQLContext.R:105:11: warning: no visible global function definition for ‘callJStatic’
    sc <- callJStatic("org.apache.spark.sql.api.r.SQLUtils", "getJavaSparkContext", sqlContext)
          ^~~~~~~~~~~
R/SQLContext.R:106:12: warning: no visible global function definition for ‘parallelize’
    rdd <- parallelize(sc, data)
           ^~~~~~~~~~~
R/SQLContext.R:114:12: warning: no visible global function definition for ‘first’, Did you mean 'dist'?
    row <- first(rdd)
           ^~~~~
R/SQLContext.R:136:26: warning: no visible binding for global variable ‘infer_type’
    types <- lapply(row, infer_type)
                         ^~~~~~~~~~
R/SQLContext.R:138:7: warning: no visible global function definition for ‘structField’
      structField(names[[i]], types[[i]], TRUE)
      ^~~~~~~~~~~
R/SQLContext.R:140:23: warning: no visible binding for global variable ‘structType’
    schema <- do.call(structType, fields)
                      ^~~~~~~~~~
R/SQLContext.R:146:11: warning: no visible global function definition for ‘getJRDD’
  jrdd <- getJRDD(lapply(rdd, function(x) x), "row")
          ^~~~~~~
R/SQLContext.R:147:11: warning: no visible global function definition for ‘callJMethod’
  srdd <- callJMethod(jrdd, "rdd")
          ^~~~~~~~~~~
R/SQLContext.R:150:3: warning: no visible global function definition for ‘dataFrame’, Did you mean 'data.frame'?
  dataFrame(sdf)
  ^~~~~~~~~
R/SQLContext.R:205:10: warning: no visible global function definition for ‘callJMethod’
  sdf <- callJMethod(sqlContext, "jsonFile", path)
         ^~~~~~~~~~~
R/SQLContext.R:206:3: warning: no visible global function definition for ‘dataFrame’, Did you mean 'data.frame'?
  dataFrame(sdf)
  ^~~~~~~~~
R/SQLContext.R:230:10: warning: no visible global function definition for ‘serializeToString’
  rdd <- serializeToString(rdd)
         ^~~~~~~~~~~~~~~~~
R/SQLContext.R:232:12: warning: no visible global function definition for ‘callJMethod’
    sdf <- callJMethod(sqlContext, "jsonRDD", callJMethod(getJRDD(rdd), "rdd"), samplingRatio)
           ^~~~~~~~~~~
R/SQLContext.R:232:12: warning: no visible global function definition for ‘callJMethod’
    sdf <- callJMethod(sqlContext, "jsonRDD", callJMethod(getJRDD(rdd), "rdd"), samplingRatio)
           ^~~~~~~~~~~
R/SQLContext.R:232:59: warning: no visible global function definition for ‘getJRDD’
    sdf <- callJMethod(sqlContext, "jsonRDD", callJMethod(getJRDD(rdd), "rdd"), samplingRatio)
                                                          ^~~~~~~
R/SQLContext.R:233:5: warning: no visible global function definition for ‘dataFrame’, Did you mean 'data.frame'?
    dataFrame(sdf)
    ^~~~~~~~~
R/SQLContext.R:253:10: warning: no visible global function definition for ‘callJMethod’
  sdf <- callJMethod(sqlContext, "parquetFile", paths)
         ^~~~~~~~~~~
R/SQLContext.R:254:3: warning: no visible global function definition for ‘dataFrame’, Did you mean 'data.frame'?
  dataFrame(sdf)
  ^~~~~~~~~
R/SQLContext.R:276:9: warning: no visible global function definition for ‘callJMethod’
 sdf <- callJMethod(sqlContext, "sql", sqlQuery)
        ^~~~~~~~~~~
R/SQLContext.R:277:2: warning: no visible global function definition for ‘dataFrame’, Did you mean 'data.frame'?
 dataFrame(sdf)
 ^~~~~~~~~
R/SQLContext.R:300:10: warning: no visible global function definition for ‘callJMethod’
  sdf <- callJMethod(sqlContext, "table", tableName)
         ^~~~~~~~~~~
R/SQLContext.R:301:3: warning: no visible global function definition for ‘dataFrame’, Did you mean 'data.frame'?
  dataFrame(sdf)
  ^~~~~~~~~
R/SQLContext.R:322:5: warning: no visible global function definition for ‘callJMethod’
    callJMethod(sqlContext, "tables")
    ^~~~~~~~~~~
R/SQLContext.R:324:5: warning: no visible global function definition for ‘callJMethod’
    callJMethod(sqlContext, "tables", databaseName)
    ^~~~~~~~~~~
R/SQLContext.R:326:3: warning: no visible global function definition for ‘dataFrame’, Did you mean 'data.frame'?
  dataFrame(jdf)
  ^~~~~~~~~
R/SQLContext.R:347:5: warning: no visible global function definition for ‘callJMethod’
    callJMethod(sqlContext, "tableNames")
    ^~~~~~~~~~~
R/SQLContext.R:349:5: warning: no visible global function definition for ‘callJMethod’
    callJMethod(sqlContext, "tableNames", databaseName)
    ^~~~~~~~~~~
R/SQLContext.R:373:3: warning: no visible global function definition for ‘callJMethod’
  callJMethod(sqlContext, "cacheTable", tableName)
  ^~~~~~~~~~~
R/SQLContext.R:395:3: warning: no visible global function definition for ‘callJMethod’
  callJMethod(sqlContext, "uncacheTable", tableName)
  ^~~~~~~~~~~
R/SQLContext.R:409:3: warning: no visible global function definition for ‘callJMethod’
  callJMethod(sqlContext, "clearCache")
  ^~~~~~~~~~~
R/SQLContext.R:432:3: warning: no visible global function definition for ‘callJMethod’
  callJMethod(sqlContext, "dropTempTable", tableName)
  ^~~~~~~~~~~
R/SQLContext.R:456:14: warning: no visible global function definition for ‘varargsToEnv’
  options <- varargsToEnv(...)
             ^~~~~~~~~~~~
R/SQLContext.R:458:14: style: Only use double-quotes.
    options[['path']] <- path
             ^~~~~~
R/SQLContext.R:461:47: warning: no visible binding for global variable ‘.sparkREnv’
    sqlContext <- get(".sparkRSQLsc", envir = .sparkREnv)
                                              ^~~~~~~~~~
R/SQLContext.R:470:12: warning: no visible global function definition for ‘callJStatic’
    sdf <- callJStatic("org.apache.spark.sql.api.r.SQLUtils", "loadDF", sqlContext, source, options)
           ^~~~~~~~~~~
R/SQLContext.R:472:3: warning: no visible global function definition for ‘dataFrame’, Did you mean 'data.frame'?
  dataFrame(sdf)
  ^~~~~~~~~
R/SQLContext.R:479:3: warning: no visible global function definition for ‘read.df’, Did you mean 'read.dcf'?
  read.df(sqlContext, path, source, schema, ...)
  ^~~~~~~
R/SQLContext.R:505:14: warning: no visible global function definition for ‘varargsToEnv’
  options <- varargsToEnv(...)
             ^~~~~~~~~~~~
R/SQLContext.R:507:14: style: Only use double-quotes.
    options[['path']] <- path
             ^~~~~~
R/SQLContext.R:509:10: warning: no visible global function definition for ‘callJMethod’
  sdf <- callJMethod(sqlContext, "createExternalTable", tableName, source, options)
         ^~~~~~~~~~~
R/SQLContext.R:510:3: warning: no visible global function definition for ‘dataFrame’, Did you mean 'data.frame'?
  dataFrame(sdf)
  ^~~~~~~~~
R/utils.R:25:14: warning: no visible global function definition for ‘callJMethod’
  arrSize <- callJMethod(jList, "size")
             ^~~~~~~~~~~
R/utils.R:35:14: style: Place a space before left parenthesis, except in a function call.
    lapply(0:(arrSize - 1),
             ^
R/utils.R:37:20: warning: no visible global function definition for ‘callJMethod’
            obj <- callJMethod(jList, "get", as.integer(index))
                   ^~~~~~~~~~~
R/utils.R:44:26: style: Use <-, not =, for assignment.
                keyBytes = callJMethod(obj, "_1")
                         ^
R/utils.R:44:28: warning: no visible global function definition for ‘callJMethod’
                keyBytes = callJMethod(obj, "_1")
                           ^~~~~~~~~~~
R/utils.R:45:26: style: Use <-, not =, for assignment.
                valBytes = callJMethod(obj, "_2")
                         ^
R/utils.R:45:28: warning: no visible global function definition for ‘callJMethod’
                valBytes = callJMethod(obj, "_2")
                           ^~~~~~~~~~~
R/utils.R:62:26: warning: no visible global function definition for ‘readRowList’
                  res <- readRowList(obj)
                         ^~~~~~~~~~~
R/utils.R:136:20: warning: no visible global function definition for ‘mult31AndAdd’
          hashC <- mult31AndAdd(hashC, asciiVals[k])
                   ^~~~~~~~~~~~
R/utils.R:163:11: warning: no visible global function definition for ‘wrapInt’
          wrapInt(as.numeric(a) + as.numeric(b))
          ^~~~~~~
R/utils.R:191:5: warning: no visible global function definition for ‘getJRDD’
    getJRDD(ser.rdd, serializedMode = "string")
    ^~~~~~~
R/utils.R:282:12: warning: no visible global function definition for ‘genCompactLists’
  lists <- genCompactLists(tagged_list, cnull)
           ^~~~~~~~~~~~~~~
R/utils.R:283:3: warning: no visible global function definition for ‘mergeCompactLists’
  mergeCompactLists(lists[[1]], lists[[2]])
  ^~~~~~~~~~~~~~~~~
R/utils.R:338:1: style: lines should not be more than 100 characters.
                         "DISK_ONLY" = callJStatic("org.apache.spark.storage.StorageLevel", "DISK_ONLY"),
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/utils.R:339:1: style: lines should not be more than 100 characters.
                         "DISK_ONLY_2" = callJStatic("org.apache.spark.storage.StorageLevel", "DISK_ONLY_2"),
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/utils.R:340:1: style: lines should not be more than 100 characters.
                         "MEMORY_AND_DISK" = callJStatic("org.apache.spark.storage.StorageLevel", "MEMORY_AND_DISK"),
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/utils.R:341:1: style: lines should not be more than 100 characters.
                         "MEMORY_AND_DISK_2" = callJStatic("org.apache.spark.storage.StorageLevel", "MEMORY_AND_DISK_2"),
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/utils.R:342:1: style: lines should not be more than 100 characters.
                         "MEMORY_AND_DISK_SER" = callJStatic("org.apache.spark.storage.StorageLevel", "MEMORY_AND_DISK_SER"),
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/utils.R:343:1: style: lines should not be more than 100 characters.
                         "MEMORY_AND_DISK_SER_2" = callJStatic("org.apache.spark.storage.StorageLevel", "MEMORY_AND_DISK_SER_2"),
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/utils.R:344:1: style: lines should not be more than 100 characters.
                         "MEMORY_ONLY" = callJStatic("org.apache.spark.storage.StorageLevel", "MEMORY_ONLY"),
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/utils.R:345:1: style: lines should not be more than 100 characters.
                         "MEMORY_ONLY_2" = callJStatic("org.apache.spark.storage.StorageLevel", "MEMORY_ONLY_2"),
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/utils.R:346:1: style: lines should not be more than 100 characters.
                         "MEMORY_ONLY_SER" = callJStatic("org.apache.spark.storage.StorageLevel", "MEMORY_ONLY_SER"),
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/utils.R:347:1: style: lines should not be more than 100 characters.
                         "MEMORY_ONLY_SER_2" = callJStatic("org.apache.spark.storage.StorageLevel", "MEMORY_ONLY_SER_2"),
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/utils.R:348:1: style: lines should not be more than 100 characters.
                         "OFF_HEAP" = callJStatic("org.apache.spark.storage.StorageLevel", "OFF_HEAP"))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/utils.R:362:3: warning: no visible global function definition for ‘callJStatic’
  callJStatic("org.apache.spark.sql.api.r.SQLUtils", "toSeq", list(...))
  ^~~~~~~~~~~
R/utils.R:367:3: warning: no visible global function definition for ‘callJStatic’
  callJStatic("org.apache.spark.sql.api.r.SQLUtils", "toSeq", l)
  ^~~~~~~~~~~
R/utils.R:390:12: style: Opening curly braces should never go on their own line and should always be followed by a new line.
    } else {  # if node[[1]] is length of 1, check for some R special functions.
           ^
R/utils.R:392:47: style: Opening curly braces should never go on their own line and should always be followed by a new line.
      if (nodeChar == "{" || nodeChar == "(") {  # Skip start symbol.
                                              ^
R/utils.R:397:39: style: Opening curly braces should never go on their own line and should always be followed by a new line.
                   nodeChar == "<<-") { # Assignment Ops.
                                      ^
R/utils.R:401:11: warning: no visible global function definition for ‘addItemToAccumulator’
          addItemToAccumulator(defVars, as.character(defVar))
          ^~~~~~~~~~~~~~~~~~~~
R/utils.R:408:42: style: Opening curly braces should never go on their own line and should always be followed by a new line.
      } else if (nodeChar == "function") {  # Function definition.
                                         ^
R/utils.R:411:41: warning: no visible global function definition for ‘addItemToAccumulator’
        lapply(newArgs, function(arg) { addItemToAccumulator(defVars, arg) })
                                        ^~~~~~~~~~~~~~~~~~~~
R/utils.R:415:35: style: Opening curly braces should never go on their own line and should always be followed by a new line.
      } else if (nodeChar == "$") {  # Skip the field.
                                  ^
R/utils.R:429:38: style: Opening curly braces should never go on their own line and should always be followed by a new line.
    if (!nodeChar %in% defVars$data) {  # Not a function parameter or local variable.
                                     ^
R/utils.R:440:64: style: Opening curly braces should never go on their own line and should always be followed by a new line.
              !(nodeChar %in% getNamespaceExports("SparkR")))) {  # Only include SparkR internals.
                                                               ^
R/utils.R:446:35: style: Opening curly braces should never go on their own line and should always be followed by a new line.
            if (is.function(obj)) {  # If the node is a function call.
                                  ^
R/utils.R:452:35: style: Opening curly braces should never go on their own line and should always be followed by a new line.
              if (sum(found) > 0) {  # If function has been examined, ignore.
                                  ^
R/utils.R:463:22: warning: no visible global function definition for ‘cleanClosure’
              obj <- cleanClosure(obj, checkedFuncs)
                     ^~~~~~~~~~~~
R/utils.R:493:16: warning: no visible global function definition for ‘initAccumulator’
    defVars <- initAccumulator()
               ^~~~~~~~~~~~~~~
R/utils.R:495:41: style: Opening curly braces should never go on their own line and should always be followed by a new line.
    for (i in 1:(length(argNames) - 1)) {  # Remove the ending NULL in pairlist.
                                        ^
R/utils.R:496:7: warning: no visible global function definition for ‘addItemToAccumulator’
      addItemToAccumulator(defVars, argNames[i])
      ^~~~~~~~~~~~~~~~~~~~
R/utils.R:499:5: warning: no visible global function definition for ‘processClosure’
    processClosure(func.body, oldEnv, defVars, checkedFuncs, newEnv)
    ^~~~~~~~~~~~~~
R/utils.R:526:10: warning: no visible global function definition for ‘lapplyPartition’
    x <- lapplyPartition(x, appendLength)
         ^~~~~~~~~~~~~~~
R/utils.R:527:14: warning: no visible global function definition for ‘lapplyPartition’
    other <- lapplyPartition(other, appendLength)
             ^~~~~~~~~~~~~~~
R/utils.R:539:21: warning: no visible global function definition for ‘getSerializedMode’
  serializerMode <- getSerializedMode(rdd)
                    ^~~~~~~~~~~~~~~~~
R/utils.R:548:1: style: lines should not be more than 100 characters.
        # For zip operation, check if corresponding partitions of both RDDs have the same number of elements.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/utils.R:550:1: style: lines should not be more than 100 characters.
          stop("Can only zip RDDs with same number of elements in each pair of corresponding partitions.")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/utils.R:559:26: style: Place a space before left parenthesis, except in a function call.
          values <- part[(lengthOfKeys + 1) : (len - 1)]
                         ^
R/utils.R:565:18: warning: no visible global function definition for ‘mergeCompactLists’
          return(mergeCompactLists(keys, values))
                 ^~~~~~~~~~~~~~~~~
R/utils.R:582:3: warning: no visible global function definition for ‘PipelinedRDD’
  PipelinedRDD(rdd, partitionFunc)
  ^~~~~~~~~~~~
R/zzz.R:19:3: warning: no visible global function definition for ‘sparkR.onLoad’
  sparkR.onLoad(libname, pkgname)
  ^~~~~~~~~~~~~
Sign up for free to join this conversation on GitHub. Already have an account? Sign in to comment