aboutsummaryrefslogtreecommitdiff
diff options
context:
space:
mode:
-rw-r--r--R/pkg/R/mllib.R16
-rw-r--r--R/pkg/inst/tests/testthat/test_mllib.R16
2 files changed, 11 insertions, 21 deletions
diff --git a/R/pkg/R/mllib.R b/R/pkg/R/mllib.R
index 234b208166..98db367a85 100644
--- a/R/pkg/R/mllib.R
+++ b/R/pkg/R/mllib.R
@@ -1398,20 +1398,22 @@ setMethod("summary", signature(object = "KSTest"),
distParams <- unlist(callJMethod(jobj, "distParams"))
degreesOfFreedom <- callJMethod(jobj, "degreesOfFreedom")
- list(p.value = pValue, statistic = statistic, nullHypothesis = nullHypothesis,
- nullHypothesis.name = distName, nullHypothesis.parameters = distParams,
- degreesOfFreedom = degreesOfFreedom)
+ ans <- list(p.value = pValue, statistic = statistic, nullHypothesis = nullHypothesis,
+ nullHypothesis.name = distName, nullHypothesis.parameters = distParams,
+ degreesOfFreedom = degreesOfFreedom, jobj = jobj)
+ class(ans) <- "summary.KSTest"
+ ans
})
# Prints the summary of KSTest
#' @rdname spark.kstest
-#' @param x test result object of KSTest by \code{spark.kstest}.
+#' @param x summary object of KSTest returned by \code{summary}.
#' @export
#' @note print.summary.KSTest since 2.1.0
print.summary.KSTest <- function(x, ...) {
- jobj <- x@jobj
+ jobj <- x$jobj
summaryStr <- callJMethod(jobj, "summary")
- cat(summaryStr)
- invisible(summaryStr)
+ cat(summaryStr, "\n")
+ invisible(x)
}
diff --git a/R/pkg/inst/tests/testthat/test_mllib.R b/R/pkg/inst/tests/testthat/test_mllib.R
index 5b1404c621..24c40a8823 100644
--- a/R/pkg/inst/tests/testthat/test_mllib.R
+++ b/R/pkg/inst/tests/testthat/test_mllib.R
@@ -760,13 +760,7 @@ test_that("spark.kstest", {
expect_equal(stats$p.value, rStats$p.value, tolerance = 1e-4)
expect_equal(stats$statistic, unname(rStats$statistic), tolerance = 1e-4)
-
- printStr <- print.summary.KSTest(testResult)
- expect_match(printStr, paste0("Kolmogorov-Smirnov test summary:\\n",
- "degrees of freedom = 0 \\n",
- "statistic = 0.38208[0-9]* \\n",
- "pValue = 0.19849[0-9]* \\n",
- ".*"), perl = TRUE)
+ expect_match(capture.output(stats)[1], "Kolmogorov-Smirnov test summary:")
testResult <- spark.kstest(df, "test", "norm", -0.5)
stats <- summary(testResult)
@@ -775,13 +769,7 @@ test_that("spark.kstest", {
expect_equal(stats$p.value, rStats$p.value, tolerance = 1e-4)
expect_equal(stats$statistic, unname(rStats$statistic), tolerance = 1e-4)
-
- printStr <- print.summary.KSTest(testResult)
- expect_match(printStr, paste0("Kolmogorov-Smirnov test summary:\\n",
- "degrees of freedom = 0 \\n",
- "statistic = 0.44003[0-9]* \\n",
- "pValue = 0.09470[0-9]* \\n",
- ".*"), perl = TRUE)
+ expect_match(capture.output(stats)[1], "Kolmogorov-Smirnov test summary:")
})
sparkR.session.stop()