path="C:/Users/pm199/OneDrive/Documents/Cours L3/S6/Stage/NIRs_Sols/"
table_NIR=function(path = TRUE) {
table_sortie1=data.frame("campagne"=NA,"groupe"=NA,"operateur"=NA,"type"=NA,"numPlac"=NA,"horizon"=NA,"tamisage"=NA,"broyage"=NA,"rep"=NA)
liste_tableFichiers=list.files(path)
data=read.csv(paste(path,"GBW_sols broyes_2mm",sep=""),sep=";", header=TRUE)
setwd("C:/Users/pm199/OneDrive/Documents/Cours L3/S6/Stage/NIRs_Sols/GBW_sols broyes_2mm")
liste_tableFichiers1=list.files("C:/Users/pm199/OneDrive/Documents/Cours L3/S6/Stage/NIRs_Sols/GBW_sols broyes_2mm")
nbre_fichiers=length(liste_tableFichiers1)
j=1
ajout_col=0
while (j<=nbre_fichiers) {
data2=read.csv(paste(liste_tableFichiers1[j+1],sep=""),header=F,sep=";")
max_freq=max(data2[,1])
if (max_freq>8000) {
n=dim(data2)[1]
if (ajout_col==0) {
vect_code=paste("N",1:n,sep="")
mat=matrix(data=NA,nrow=1,ncol=n)
table_sortie1=cbind(table_sortie1,mat)
colnames(table_sortie1)[c(10:(n+9))]=vect_code
table_sortie2=data.frame("Code"=rep(NA,n),"Frequence"=rep(NA,n))
table_sortie2[,1]=vect_code
table_sortie2[,2]=data2[,1]
vect_code=paste("N",1:n,sep="")
ajout_col=1
}
}
}
setwd("C:/Users/pm199/OneDrive/Documents/Cours L3/S6/Stage/NIRs_Sols/GBW_sols tamises_2mm")
liste_tableFichiers2=list.files("C:/Users/pm199/OneDrive/Documents/Cours L3/S6/Stage/NIRs_Sols/GBW_sols tamises_2mm")
nbre_fichiers1=length(liste_tableFichiers2)
j=1
ajout_col=0
while (j<=nbre_fichiers1) {
data3=read.csv(paste(liste_tableFichiers2[j+1],sep=""),header=F,sep=";")
max_freq1=max(data3[,1])
if (max_freq>8000) {
n1=dim(data3)[1]
if (ajout_col==0) {
vect_code=paste("N",1:n1,sep="")
mat1=matrix(data=NA,nrow=1,ncol=n1)
table_sortie1=cbind(table_sortie1,mat1)
colnames(table_sortie1)[c(10:(n+9))]=vect_code
table_sortie3=data.frame("Code"=rep(NA,n1),"Frequence"=rep(NA,n1))
table_sortie3[,1]=vect_code
table_sortie3[,2]=data3[,1]
vect_code=paste("N",1:n1,sep="")
ajout_col=1
}
}
}
setwd("C:/Users/pm199/OneDrive/Documents/Cours L3/S6/Stage/NIRs_Sols/GBW_sols tamises_4mm")
liste_tableFichiers2=list.files("C:/Users/pm199/OneDrive/Documents/Cours L3/S6/Stage/NIRs_Sols/GBW_sols tamises_4mm")
nbre_fichiers2=length(liste_tableFichiers2)
j=1
ajout_col=0
while (j<=nbre_fichiers2) {
data4=read.csv(paste(liste_tableFichiers2[j+1],sep=""),header=F,sep=";")
max_freq2=max(data4[,1])
if (max_freq>8000) {
n2=dim(data4)[1]
if (ajout_col==0) {
vect_code=paste("N",1:n2,sep="")
mat2=matrix(data=NA,nrow=1,ncol=n2)
table_sortie1=cbind(table_sortie1,mat2)
colnames(table_sortie1)[c(10:(n+9))]=vect_code
table_sortie4=data.frame("Code"=rep(NA,n2),"Frequence"=rep(NA,n2))
table_sortie4[,1]=vect_code
table_sortie4[,2]=data4[,1]
vect_code=paste("N",1:n2,sep="")
ajout_col=1
}
}
}
liste=list(table_sortie1,table_sortie2,table_sortie3,table_sortie4)
return(liste)
}
De plus, quand je charge la dernière ligne de code, un message d’erreur s’affiche:
Erreur : aucune fonction d’où sortir ; saut vers le niveau le plus haut