Hi All,
I get an error message "all arguments must have the same length" when I run this code.
Would it be possible for someone to show me how to overcome this error, given `test$y,' and 'pred_label' both have the same input length?
I am currently struggling to generate a confusion matrix (ironically) from this data, and all help would be appreciated.
library(neuralnet)
library(tidyverse)
#MOCK DATA
x1 = rep(1:3, times = 40)
x2 = rep(1:3, times = 40)
x3 = rep(1:3, times = 40)
x4 = rep(1:3, times = 40)
x5 = rep(1:3, times = 40)
y = rep(0:1, times = 60)
y <- as.factor(y)
dat <- data.frame(y, x1, x2, x3, x4, x5)
#SPLIT
set.seed(123)
indexes=createDataPartition(dat$y, p=.85, list = F)
train = dat[indexes, ]
test = dat[-indexes, ]
xtest = test[, -1]
ytest = test[, 1]
#MODEL
NN1 <- neuralnet(y ~., train,
linear.output = FALSE,
stepmax=1e7)
#ACCURACY TEST
pred <- predict(NN1, test)
labels <- c("0", "1")
pred_label <- data.frame(max.col(pred)) %>%
mutate(pred=labels[max.col.pred.]) %>%
select(2) %>%
unlist()
table(test$y, prediction_label)
I am currently following this tutorial. https://www.datacamp.com/tutorial/neural-network-models-r