Problem with PCA

Good evening
I have a problem wanting to do the PCA
here is the error message.

1

Please click on this link to download the database

Here are the codes used

BD_donnees<-read.csv(file='D:/donnees.csv', header = TRUE, sep = ";",
         dec = ",",row.names = 1)
## CHARGEMENT DES PACKAGE
library(FactoMineR)
library(missMDA)
library(FactoInvestigate)
library(Factoshiny)

# ABREVIATION DES VARIABLES
colnames(BD_donnees)<-c("PE","IE","ER","CEAS","CEA","CET","CEI","CES","ERP","ERA","AT")


# PRESENTATION DES DONNEES

## Tableau
head(BD_donnees)

##Tableau des données statistiques 
summary(BD_donnees)

# REALISATION DE L'ACP
## Completer les données manquantes
comp <- imputePCA(BD_donnees)

##ACP
e=c(1,2,3,4,5,6,7,8,9,10,11)
acp_BD_donnees<-PCA(comp$completeObs,quanti.sup =e)

## PRESENTATION DES RESULTATS DE L'ACP

## Valeurs propres
acp_BD_donnees$eig

## Coordonnées des individus
acp_BD_donnees$ind$coord

## Cosinus carrés des individus
acp_BD_donnees$ind$cos2

## Contribution
acp_BD_donnees$ind$contrib

#ACP AVEC PCAShiny
PCAshiny(acp_BD_donnees)

#GENERER LE RAPPORT AVEC FACTOINVESTIGATE
Investigate(acp_BD_donnees, file = "PCA.Rmd", document = "word_document", time = "1000L", parallel = FALSE)

Thank you in advance

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

If you have a query related to it or one of the replies, start a new topic and refer back with a link.