... | ... |
@@ -105,7 +105,7 @@ batchSom.default <- function(data, somGrid, init = c("pca", "random"), prototype |
105 | 105 |
verbose = FALSE, keepdata = TRUE, ...) { |
106 | 106 |
theCall <- match.call() |
107 | 107 |
if (verbose) { |
108 |
- print(theCall) |
|
108 |
+ message(theCall) |
|
109 | 109 |
} |
110 | 110 |
theCall[[1]] <- batchSomControl |
111 | 111 |
control <- eval(theCall, envir = parent.frame()) |