Hello,
I have a quite basic question. I am trying to do a Normality test for 28 variables. So, I decided to apply the function mshapiro.test. I have written it as follows:
mshapiro.test(datos[, 1:28])
However, I get the following error: Error in mshapiro.test(datos[, 1:28]) : U[] is not a matrix with number of columns (sample size) between 3 and 5000. I don't understand what I've done wrong.
For if it helps, the steps prior to this have been:
library(geomorph)
tps <-readland.tps(file.choose("File.tps"), specID = c("ID"), readcurves = TRUE, warnmsg = T)
slides <- define.sliders(c(4:14))
gpa<-gpagen(A=tps,curves = slides, PrinAxes = TRUE, Proj = TRUE, print.progress = TRUE)
gdf <- geomorph.data.frame(gpa)
gdf$coords
datos1 <-two.d.array(gdf$coords)
datos<-as.data.frame(datos1)
library(mvnormtest)
And, finally:
mshapiro.test(datos[, 1:28])
I would really appreciate if someone could help me. Thank you in advance.