Skip to content

Instantly share code, notes, and snippets.

@HyukjinKwon
Created September 20, 2017 07:57
Show Gist options
  • Save HyukjinKwon/4f59ddcc7b6487a02da81800baca533c to your computer and use it in GitHub Desktop.
Save HyukjinKwon/4f59ddcc7b6487a02da81800baca533c to your computer and use it in GitHub Desktop.
[R] SPARK-22063 lintr results
inst/worker/worker.R:71:10: style: Remove spaces before the left parenthesis in a function call.
return (output)
^
R/column.R:241:1: style: Lines should not be more than 100 characters.
#' \href{https://spark.apache.org/docs/latest/sparkr.html#data-type-mapping-between-r-and-spark}{
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/context.R:332:1: style: Variable and function names should not be longer than 30 characters.
spark.getSparkFilesRootDirectory <- function() {
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/DataFrame.R:1912:1: style: Lines should not be more than 100 characters.
#' @param j,select expression for the single Column or a list of columns to select from the SparkDataFrame.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/DataFrame.R:1918:1: style: Lines should not be more than 100 characters.
#' @return A new SparkDataFrame containing only the rows that meet the condition with selected columns.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/DataFrame.R:2597:22: style: Remove spaces before the left parenthesis in a function call.
return (joinRes)
^
R/DataFrame.R:2652:1: style: Variable and function names should not be longer than 30 characters.
generateAliasesForIntersectedCols <- function (x, intersectedColNames, suffix) {
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/DataFrame.R:2652:47: style: Remove spaces before the left parenthesis in a function call.
generateAliasesForIntersectedCols <- function (x, intersectedColNames, suffix) {
^
R/DataFrame.R:2660:14: style: Remove spaces before the left parenthesis in a function call.
stop ("The following column name: ", newJoin, " occurs more than once in the 'DataFrame'.",
^
R/DataFrame.R:3047:1: style: Lines should not be more than 100 characters.
#' @note The statistics provided by \code{summary} were change in 2.3.0 use \link{describe} for previous defaults.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/DataFrame.R:3754:1: style: Lines should not be more than 100 characters.
#' If grouping expression is missing \code{cube} creates a single global aggregate and is equivalent to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/DataFrame.R:3789:1: style: Lines should not be more than 100 characters.
#' If grouping expression is missing \code{rollup} creates a single global aggregate and is equivalent to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/deserialize.R:46:10: style: Remove spaces before the left parenthesis in a function call.
switch (type,
^
R/functions.R:41:1: style: Lines should not be more than 100 characters.
#' @param x Column to compute on. In \code{window}, it must be a time Column of \code{TimestampType}.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:93:1: style: Lines should not be more than 100 characters.
#' @param x Column to compute on. In \code{shiftLeft}, \code{shiftRight} and \code{shiftRightUnsigned},
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:483:52: style: Remove spaces before the left parenthesis in a function call.
jcols <- lapply(list(x, ...), function (x) {
^
R/functions.R:679:52: style: Remove spaces before the left parenthesis in a function call.
jcols <- lapply(list(x, ...), function (x) {
^
R/functions.R:1313:1: style: Lines should not be more than 100 characters.
#' @param scale round to \code{scale} digits to the right of the decimal point when \code{scale} > 0,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:2008:1: style: Lines should not be more than 100 characters.
#' \code{nanvl}: Returns the first column (\code{y}) if it is not NaN, or the second column (\code{x}) if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:2064:49: style: Remove spaces before the left parenthesis in a function call.
jcols <- lapply(list(...), function (x) {
^
R/functions.R:2093:52: style: Remove spaces before the left parenthesis in a function call.
jcols <- lapply(list(x, ...), function (x) {
^
R/functions.R:2113:52: style: Remove spaces before the left parenthesis in a function call.
jcols <- lapply(list(x, ...), function (x) {
^
R/functions.R:2133:52: style: Remove spaces before the left parenthesis in a function call.
jcols <- lapply(list(x, ...), function (x) {
^
R/functions.R:2407:1: style: Lines should not be more than 100 characters.
#' \code{shiftRight}: (Signed) shifts the given value numBits right. If the given value is a long value,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:2506:1: style: Lines should not be more than 100 characters.
#' \code{from_unixtime}: Converts the number of seconds from unix epoch (1970-01-01 00:00:00 UTC) to a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:2507:1: style: Lines should not be more than 100 characters.
#' string representing the timestamp of that moment in the current system time zone in the JVM in the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:2508:1: style: Lines should not be more than 100 characters.
#' given format. See \href{http://docs.oracle.com/javase/tutorial/i18n/format/simpleDateFormat.html}{
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:2635:1: style: Lines should not be more than 100 characters.
#' \code{rand}: Generates a random column with independent and identically distributed (i.i.d.) samples
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:2665:1: style: Lines should not be more than 100 characters.
#' \code{randn}: Generates a column with independent and identically distributed (i.i.d.) samples from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:2832:1: style: Lines should not be more than 100 characters.
#' \code{when}: Evaluates a list of conditions and returns one of multiple possible result expressions.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:2860:1: style: Lines should not be more than 100 characters.
#' \code{ifelse}: Evaluates a list of conditions and returns \code{yes} if the conditions are satisfied.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:2991:1: style: Lines should not be more than 100 characters.
#' \code{percent_rank}: Returns the relative rank (i.e. percentile) of rows within a window partition.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:3161:1: style: Lines should not be more than 100 characters.
#' \code{create_array}: Creates a new array column. The input columns must all have the same data type.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:3170:52: style: Remove spaces before the left parenthesis in a function call.
jcols <- lapply(list(x, ...), function (x) {
^
R/functions.R:3179:1: style: Lines should not be more than 100 characters.
#' \code{create_map}: Creates a new map column. The input columns must be grouped as key-value pairs,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:3191:52: style: Remove spaces before the left parenthesis in a function call.
jcols <- lapply(list(x, ...), function (x) {
^
R/functions.R:3353:1: style: Lines should not be more than 100 characters.
#' \code{grouping_bit}: Indicates whether a specified column in a GROUP BY list is aggregated or not,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:3354:1: style: Lines should not be more than 100 characters.
#' returns 1 for aggregated or 0 for not aggregated in the result set. Same as \code{GROUPING} in SQL
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/functions.R:3413:52: style: Remove spaces before the left parenthesis in a function call.
jcols <- lapply(list(x, ...), function (x) {
^
R/generics.R:388:28: style: Remove spaces before the left parenthesis in a function call.
setGeneric("agg", function (x, ...) { standardGeneric("agg") })
^
R/generics.R:734:73: style: Do not place spaces around code in parentheses or square brackets.
setGeneric("select", function(x, col, ...) { standardGeneric("select") } )
^
R/group.R:136:1: style: Lines should not be more than 100 characters.
# These are not exposed on GroupedData: "kurtosis", "skewness", "stddev", "stddev_samp", "stddev_pop",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:61:1: style: Lines should not be more than 100 characters.
#' @param standardization Whether to standardize the training features before fitting the model. The coefficients
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:62:1: style: Lines should not be more than 100 characters.
#' of models will be always returned on the original scale, so it will be transparent for
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:63:1: style: Lines should not be more than 100 characters.
#' users. Note that with/without standardization, the models should be always converged
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:69:1: style: Lines should not be more than 100 characters.
#' @param aggregationDepth The depth for treeAggregate (greater than or equal to 2). If the dimensions of features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:70:1: style: Lines should not be more than 100 characters.
#' or the number of partitions are large, this param could be adjusted to a larger size.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:72:1: style: Lines should not be more than 100 characters.
#' @param handleInvalid How to handle invalid data (unseen labels or NULL values) in features and label
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:75:1: style: Lines should not be more than 100 characters.
#' "error" (throw an error), "keep" (put invalid data in a special additional
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:178:1: style: Lines should not be more than 100 characters.
#' Fits an logistic regression model against a SparkDataFrame. It supports "binomial": Binary logistic regression
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:179:1: style: Lines should not be more than 100 characters.
#' with pivoting; "multinomial": Multinomial logistic (softmax) regression without pivoting, similar to glmnet.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:186:1: style: Lines should not be more than 100 characters.
#' @param elasticNetParam the ElasticNet mixing parameter. For alpha = 0.0, the penalty is an L2 penalty.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:187:1: style: Lines should not be more than 100 characters.
#' For alpha = 1.0, it is an L1 penalty. For 0.0 < alpha < 1.0, the penalty is a combination
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:191:1: style: Lines should not be more than 100 characters.
#' @param family the name of family which is a description of the label distribution to be used in the model.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:198:1: style: Lines should not be more than 100 characters.
#' \item{"multinomial": Multinomial logistic (softmax) regression without pivoting.}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:200:1: style: Lines should not be more than 100 characters.
#' @param standardization whether to standardize the training features before fitting the model. The coefficients
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:201:1: style: Lines should not be more than 100 characters.
#' of models will be always returned on the original scale, so it will be transparent for
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:202:1: style: Lines should not be more than 100 characters.
#' users. Note that with/without standardization, the models should be always converged
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:203:1: style: Lines should not be more than 100 characters.
#' to the same solution when no regularization is applied. Default is TRUE, same as glmnet.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:204:1: style: Lines should not be more than 100 characters.
#' @param thresholds in binary classification, in range [0, 1]. If the estimated probability of class label 1
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:205:1: style: Lines should not be more than 100 characters.
#' is > threshold, then predict 1, else 0. A high threshold encourages the model to predict 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:206:1: style: Lines should not be more than 100 characters.
#' more often; a low threshold encourages the model to predict 1 more often. Note: Setting this with
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:207:1: style: Lines should not be more than 100 characters.
#' threshold p is equivalent to setting thresholds c(1-p, p). In multiclass (or binary) classification to adjust the probability of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:208:1: style: Lines should not be more than 100 characters.
#' predicting each class. Array must have length equal to the number of classes, with values > 0,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:209:1: style: Lines should not be more than 100 characters.
#' excepting that at most one value may be 0. The class with largest value p/t is predicted, where p
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:212:1: style: Lines should not be more than 100 characters.
#' @param aggregationDepth The depth for treeAggregate (greater than or equal to 2). If the dimensions of features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:213:1: style: Lines should not be more than 100 characters.
#' or the number of partitions are large, this param could be adjusted to a larger size.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:215:1: style: Lines should not be more than 100 characters.
#' @param lowerBoundsOnCoefficients The lower bounds on coefficients if fitting under bound constrained optimization.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:216:1: style: Lines should not be more than 100 characters.
#' The bound matrix must be compatible with the shape (1, number of features) for binomial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:217:1: style: Lines should not be more than 100 characters.
#' regression, or (number of classes, number of features) for multinomial regression.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:219:1: style: Lines should not be more than 100 characters.
#' @param upperBoundsOnCoefficients The upper bounds on coefficients if fitting under bound constrained optimization.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:220:1: style: Lines should not be more than 100 characters.
#' The bound matrix must be compatible with the shape (1, number of features) for binomial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:221:1: style: Lines should not be more than 100 characters.
#' regression, or (number of classes, number of features) for multinomial regression.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:223:1: style: Lines should not be more than 100 characters.
#' @param lowerBoundsOnIntercepts The lower bounds on intercepts if fitting under bound constrained optimization.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:224:1: style: Lines should not be more than 100 characters.
#' The bounds vector size must be equal to 1 for binomial regression, or the number
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:226:1: style: Lines should not be more than 100 characters.
#' @param upperBoundsOnIntercepts The upper bounds on intercepts if fitting under bound constrained optimization.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:227:1: style: Lines should not be more than 100 characters.
#' The bound vector size must be equal to 1 for binomial regression, or the number
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:229:1: style: Lines should not be more than 100 characters.
#' @param handleInvalid How to handle invalid data (unseen labels or NULL values) in features and label
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:232:1: style: Lines should not be more than 100 characters.
#' "error" (throw an error), "keep" (put invalid data in a special additional
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:415:1: style: Lines should not be more than 100 characters.
#' @param handleInvalid How to handle invalid data (unseen labels or NULL values) in features and label
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:418:1: style: Lines should not be more than 100 characters.
#' "error" (throw an error), "keep" (put invalid data in a special additional
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:455:20: style: Remove spaces before the left parenthesis in a function call.
stop ("layers must be a integer vector with length > 1.")
^
R/mllib_classification.R:459:20: style: Remove spaces before the left parenthesis in a function call.
stop ("layers must be a integer vector with length > 1.")
^
R/mllib_classification.R:541:1: style: Lines should not be more than 100 characters.
#' @param handleInvalid How to handle invalid data (unseen labels or NULL values) in features and label
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_classification.R:544:1: style: Lines should not be more than 100 characters.
#' "error" (throw an error), "keep" (put invalid data in a special additional
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_clustering.R:63:1: style: Lines should not be more than 100 characters.
#' or the minimum proportion of points (if less than 1.0) of a divisible cluster.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_clustering.R:64:1: style: Lines should not be more than 100 characters.
#' Note that it is an expert parameter. The default value should be good enough
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_clustering.R:331:1: style: Lines should not be more than 100 characters.
#' This is an advanced setting, the default of 2 is almost always enough. Must be > 0.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_clustering.R:551:1: style: Lines should not be more than 100 characters.
#' \item{\code{trainingLogLikelihood}}{Log likelihood of the observed tokens in the training set,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_regression.R:61:1: style: Lines should not be more than 100 characters.
#' \item When package \code{statmod} is loaded, the tweedie family is specified using the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_regression.R:74:1: style: Lines should not be more than 100 characters.
#' decide the base level of a string feature as the last category after
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_regression.R:78:1: style: Lines should not be more than 100 characters.
#' "alphabetDesc", this drops the same category as R when encoding strings.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_regression.R:79:1: style: Lines should not be more than 100 characters.
#' @param offsetCol the offset column name. If this is not set or empty, we treat all instance offsets
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_regression.R:200:1: style: Lines should not be more than 100 characters.
#' decide the base level of a string feature as the last category after
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_regression.R:204:1: style: Lines should not be more than 100 characters.
#' "alphabetDesc", this drops the same category as R when encoding strings.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_regression.R:205:1: style: Lines should not be more than 100 characters.
#' @param offsetCol the offset column name. If this is not set or empty, we treat all instance offsets
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_regression.R:236:1: style: Lines should not be more than 100 characters.
#' The list of components includes at least the \code{coefficients} (coefficients matrix, which includes
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_regression.R:239:1: style: Lines should not be more than 100 characters.
#' and \code{iter} (number of iterations IRLS takes). If there are collinear columns in the data,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_regression.R:460:1: style: Lines should not be more than 100 characters.
#' @param aggregationDepth The depth for treeAggregate (greater than or equal to 2). If the dimensions of features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_regression.R:461:1: style: Lines should not be more than 100 characters.
#' or the number of partitions are large, this param could be adjusted to a larger size.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_regression.R:464:1: style: Lines should not be more than 100 characters.
#' decide the base level of a string feature as the last category after
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_regression.R:468:1: style: Lines should not be more than 100 characters.
#' "alphabetDesc", this drops the same category as R when encoding strings.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_tree.R:135:1: style: Lines should not be more than 100 characters.
#' \href{http://spark.apache.org/docs/latest/ml-classification-regression.html#gradient-boosted-tree-regression}{
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_tree.R:137:1: style: Lines should not be more than 100 characters.
#' \href{http://spark.apache.org/docs/latest/ml-classification-regression.html#gradient-boosted-tree-classifier}{
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_tree.R:167:1: style: Lines should not be more than 100 characters.
#' @param handleInvalid How to handle invalid data (unseen labels or NULL values) in features and label
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_tree.R:170:1: style: Lines should not be more than 100 characters.
#' "error" (throw an error), "keep" (put invalid data in a special additional
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_tree.R:355:1: style: Lines should not be more than 100 characters.
#' \href{http://spark.apache.org/docs/latest/ml-classification-regression.html#random-forest-regression}{
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_tree.R:357:1: style: Lines should not be more than 100 characters.
#' \href{http://spark.apache.org/docs/latest/ml-classification-regression.html#random-forest-classifier}{
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_tree.R:385:1: style: Lines should not be more than 100 characters.
#' @param handleInvalid How to handle invalid data (unseen labels or NULL values) in features and label
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_tree.R:388:1: style: Lines should not be more than 100 characters.
#' "error" (throw an error), "keep" (put invalid data in a special additional
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_tree.R:570:1: style: Lines should not be more than 100 characters.
#' \href{http://spark.apache.org/docs/latest/ml-classification-regression.html#decision-tree-regression}{
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_tree.R:572:1: style: Lines should not be more than 100 characters.
#' \href{http://spark.apache.org/docs/latest/ml-classification-regression.html#decision-tree-classifier}{
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_tree.R:595:1: style: Lines should not be more than 100 characters.
#' @param handleInvalid How to handle invalid data (unseen labels or NULL values) in features and label
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_tree.R:598:1: style: Lines should not be more than 100 characters.
#' "error" (throw an error), "keep" (put invalid data in a special additional
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/mllib_tree.R:674:1: style: Lines should not be more than 100 characters.
#' \code{featureImportances} (feature importances), and \code{maxDepth} (max depth of trees).
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/pairRDD.R:863:36: style: Remove spaces before the left parenthesis in a function call.
function (v) { v[[1]] })
^
R/pairRDD.R:928:27: style: Do not place spaces around code in parentheses or square brackets.
res[ (len + 1) : (len + count) ] <- rep(list(elem), count)
^
R/pairRDD.R:928:53: style: Do not place spaces around code in parentheses or square brackets.
res[ (len + 1) : (len + count) ] <- rep(list(elem), count)
^
R/RDD.R:134:92: style: Do not place spaces around code in parentheses or square brackets.
setMethod("getSerializedMode", signature(rdd = "RDD"), function(rdd) rdd@env$serializedMode )
^
R/RDD.R:148:68: style: Do not place spaces around code in parentheses or square brackets.
setMethod("getJRDD", signature(rdd = "RDD"), function(rdd) rdd@jrdd )
^
R/RDD.R:896:25: style: Do not place spaces around code in parentheses or square brackets.
res[ (len + 1) : (len + count) ] <- rep(list(elem), count)
^
R/RDD.R:896:51: style: Do not place spaces around code in parentheses or square brackets.
res[ (len + 1) : (len + count) ] <- rep(list(elem), count)
^
R/schema.R:158:12: style: Remove spaces before the left parenthesis in a function call.
switch (firstChar,
^
R/stats.R:32:1: style: Lines should not be more than 100 characters.
#' will be the distinct values of \code{col1} and the column names will be the distinct values
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/stats.R:56:1: style: Lines should not be more than 100 characters.
#' \code{cov}: When applied to SparkDataFrame, this calculates the sample covariance of two numerical
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/stats.R:162:1: style: Lines should not be more than 100 characters.
#' @return The approximate quantiles at the given probabilities. If the input is a single column name,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
R/utils.R:628:8: style: Remove spaces before the left parenthesis in a function call.
list (x, other)
^
R/utils.R:660:26: style: Do not place spaces around code in parentheses or square brackets.
values <- part[ (lengthOfKeys + 1) : (len - 1) ]
^
R/utils.R:660:57: style: Do not place spaces around code in parentheses or square brackets.
values <- part[ (lengthOfKeys + 1) : (len - 1) ]
^
R/WindowSpec.R:76:23: style: Remove spaces before the left parenthesis in a function call.
stopifnot (class(col) %in% c("character", "Column"))
^
tests/fulltests/test_binary_function.R:76:82: style: Do not place spaces around code in parentheses or square brackets.
func = function(x, y, z) { list(list(x, y, z))} ))
^
tests/fulltests/test_rdd.R:701:46: style: Remove spaces before the left parenthesis in a function call.
numPairsRdd <- map(rdd, function(x) { list (x, x) })
^
tests/fulltests/test_rdd.R:704:47: style: Remove spaces before the left parenthesis in a function call.
numPairs <- lapply(nums, function(x) { list (x, x) })
^
tests/fulltests/test_rdd.R:708:48: style: Remove spaces before the left parenthesis in a function call.
numPairsRdd2 <- map(rdd2, function(x) { list (x, x) })
^
tests/fulltests/test_sparkSQL.R:563:64: style: Remove spaces before the left parenthesis in a function call.
expect_equal(ldf$c1, list(list(1, 2, 3), list(4, 5, 6), list (7, 8, 9)))
^
tests/fulltests/test_sparkSQL.R:564:76: style: Remove spaces before the left parenthesis in a function call.
expect_equal(ldf$c2, list(list("a", "b", "c"), list("d", "e", "f"), list ("g", "h", "i")))
^
tests/fulltests/test_sparkSQL.R:565:76: style: Remove spaces before the left parenthesis in a function call.
expect_equal(ldf$c3, list(list(1.0, 2.0, 3.0), list(4.0, 5.0, 6.0), list (7.0, 8.0, 9.0)))
^
tests/fulltests/test_sparkSQL.R:1513:65: style: Do not place spaces around code in parentheses or square brackets.
expect_true(any(apply(s, 1, function(x) { x[[1]]$age == 16 } )))
^
tests/fulltests/test_sparkSQL.R:2699:7: style: Do not place spaces around code in parentheses or square brackets.
rdf[ input %% 3 == 0, ] <- c(1, "1", -1)
^
tests/fulltests/test_sparkSQL.R:3053:25: style: Remove spaces before the left parenthesis in a function call.
df <- createDataFrame (
^
tests/fulltests/test_sparkSQL.R:3124:46: style: Remove spaces before the left parenthesis in a function call.
irisDF <- suppressWarnings(createDataFrame (iris))
^
Sign up for free to join this conversation on GitHub. Already have an account? Sign in to comment