RStudio Crashed when executing rbf method from Caret

I don't know what may be the crash cause.. this occurs when I train rbf method with Caret , like this: (RSession Crashed after code execution)

library(caret)
library(mlbench)
library(dplyr)
data("HouseVotes84")
dummy_data_classif <- HouseVotes84[,1:length(colnames(HouseVotes84))] %>% 
  mutate_if(is.factor, as.numeric)

resampling <- trainControl(method = "cv",
                               number = 5,
                               allowParallel = FALSE) 
model <- caret::train(Class ~ ., 
                      data = dummy_data_classif, 
                      method = "rbf", 
                      trControl = resampling)

In the contrary, The Original rbf from RSNNS execution working fine as Expected:

library(RSNNS)
inputs <- as.matrix(dummy_data_classif[,-1])
outputs <- as.matrix(as.numeric(dummy_data_classif[,1]))
model <- RSNNS::rbf(inputs, outputs, size=40, maxit=1000, 
                    initFuncParams=c(0, 1, 0, 0.01, 0.01), 
                    learnFuncParams=c(1e-8, 0, 1e-8, 0.1, 0.8), linOut=TRUE)

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.