Introducción

Partimos del fichero de datos de D. Javier Villalva, en la hoja de datos :

files = list.files(path='~/git/JVD_HEALTH/JVD_BRAIN/', pattern = '^[0-9].*.csv$')
nfiles= length(files)
lf    = list()  # almacen de chunk de datos
lf2   = list()  # estadisticos de varaición de los chunks de datos en cada fichero
lf4   = list()  # marcas de tiempo en el chunk
for ( i in files) {
  cat(paste("Procesando ",i,".\n",sep=""))
  lf[[i]]  = list()
  lf2[[i]] = list()
  lf4[[i]] = list()
  d  = read.csv2(file=i,skip=1,sep=",",header=FALSE,stringsAsFactors = FALSE)
  d  = apply(d,2,as.numeric)
  j  = (which(d[,1]==0)[1] - 1)
  dd = d[-c(1:j),]  # Se elimina el chunck inicial si no es completo
  jdx= (which(dd[,1]==0))
  edx= c((jdx-1)[-1],nrow(dd))
  rng= data.frame(desde=jdx,hasta=edx) # Rangos de chunks de datos en 'd'
  lsg= apply(rng,1,function(x){return(x[2]-x[1]+1)})
  idx= which(lsg==median(lsg))
  lsd= apply(rng[idx,],1,function(x,y){return(as.data.frame(y[x[1]:x[2],3:16]))},dd)
  lf[[i]] = lsd  # i-esimo chunck de datos
  apl= lapply(lsd,function(x){
                  return(apply(x,2,summary))}) # resumen de estadísticos de cada chunk
  ap2= ldply(apl,function(x){
              mx = x[4,];         
              vx = t(apply(x,1,function(x,y){return(x-y)},mx))
              vr = diff(apply(vx,2,range))
              return(vr)
            })  
  lf2[[i]]= ap2 # rangos de varaiación de cada variable en cada chunk
#
  # Se procesa el fichero de índice
  j  = paste("index-",i,sep="")
  d  = read.csv2(file=j,sep=";")
  org= paste("0:",as.character(d[,3]),sep="")
  end= paste("0:",as.character(d[,4]),sep="")
  vt = apply(data.frame(org=org,end=end),1,function(x){
              return(as.difftime(c(x[1],x[2]),units="secs"))}) # duración de las pruebas
  mp = apply(vt,2,function(x){return(x[2]-x[1])})-1
  mp[is.na(mp)]=0  # reemplazar marcas como '---'
  d[,5]=mp
  d[,6]=cumsum(mp)  # Compleatnndo los índices con marcas de tiempo
  for ( j in 2:nrow(d)) {
    if (is.na(d[j,"X.CPD.nA"])) {
      d[j,"X.CPD.nA"] = d[j-1,"X.CPD.nA"]
    }
  }  
  lf4[[i]]=d        # almacenamos las marcas de tiempo
                    # cada chunk registra 1s así el chunk 153 corresponde al ejercicio P-2 
                    # del usuario 1

}
## Procesando 001-001-12.12.16-13.01.25.csv.
## Procesando 002-002-15.12.16-11.28.27.csv.
rm(j,jdx,d,edx,rng,lsg,idx,apl,lsd,i,ap2)
#

Una vez procesados estos datos se observa que hay algunas variables que no están ajustadas, al menos según lo que se acostumbra a utilizar en el paquete eegAnalysis. En los datos de JVD (ver lf4[[i]]) existen participantes (4 en el primer fichero) y existen actividades (7 .- Check, P-1, P-2, P-3, Do, Act, Test) El dispositivo registra 14 canales y la frecuencia de muestreo 128Hz (128 muestras/s).

Se propone segmentar los valores de individuo, actividad y canal para estudiar sus correlaciones.

#
indice = list()
ds     = list()
posds  = 0
for ( i in files) {
  set_ind = unique(lf4[[i]][,1])
  set_act = as.character(unique(lf4[[i]][,2]))
  indice[[i]] = data.frame(Person=lf4[[i]][,1],Action=lf4[[i]][,2],ds=rep(NA,nrow(lf4[[i]])))
  from = c(1,lf4[[i]][,6])[1:nrow(lf4[[i]])]
  to   = c(lf4[[i]][,6]-1)  
  for ( j in set_ind) {
    for ( k in set_act) {
      l = which(lf4[[i]][,1]==j & lf4[[i]][,2]==k)
      sgd    =NULL  
      if (to[l] >= from[l]) {
        for ( n in (from[l]:to[l])) {
          if ( is.null (sgd)) {
            sgd = lf[[i]][[n]]
          } else {
            sgd = rbind(sgd,lf[[i]][[n]])
          }
        }
      }
      if (! is.null(sgd)) {
        posds = posds +1
        ds[[posds]] = sgd
        indice[[i]][l,3]=posds
      }
    }
  }
}
rm(posds,sgd,n,l,k,j,i)
#

Ahora tenemos las señales segmentadas por individuo, acción y calnal En lf4 tenemos los datos de cada experimento por segundo de prueba.

Los datos de los canales se almacenan para cada indice[fichero].

Calculo de Correlación

Vamos a calcular las correlaciones por persona entre las diferentes acciones y por canal para presentar los resultados

#
Find_Max_CCF<- function(a,b) {
 d <- ccf(a, b, plot = FALSE)
 cor = d$acf[,,1]
 lag = d$lag[,,1]
 res = data.frame(cor,lag)
 res_max = res[which.max(res$cor),]
 return(res_max)
} 
#
nmc  = ncol(ds[[1]])
for (nam in as.character(unique(indice[[1]][,1]))) {
  idx  = list()
  for ( i in files) {
    idx[[i]] = indice[[i]][indice[[i]][,1] == nam,3]
    tdx = as.vector(idx[[i]])[! is.na(as.vector(idx[[i]]))]
    dms = ldply(tdx,function(x,y) { if( ! is.na(x)) {return(dim(y[[x]]))}},ds)
    mpt = max(dms[,1])
    for (k in 1:ncol(ds[[1]])) {
      dmm = matrix(NA,nrow=mpt,ncol=length(tdx))    
      for (s in 1:length(tdx)) {
        zz  = approx(1:nrow(ds[[s]]),ds[[s]][,k],n=mpt)
        dmm[,s]=zz[[2]]
      }
      cat(paste("File:", i,". Person:",nam,". Canal:",k,". There are ",length(tdx), 
                " actions. Below Correlation Matrix",sep=""))
      clm = cor(dmm)
      print(xtable(clm),type="html")
    }
  }
}
File:001-001-12.12.16-13.01.25.csv. Person:1. Canal:1. There are 6 actions. Below Correlation Matrix
1 2 3 4 5 6
1 1.00 0.08 0.10 -0.19 -0.12 -0.08
2 0.08 1.00 -0.02 0.04 -0.06 -0.00
3 0.10 -0.02 1.00 -0.02 -0.04 -0.17
4 -0.19 0.04 -0.02 1.00 0.04 0.29
5 -0.12 -0.06 -0.04 0.04 1.00 0.06
6 -0.08 -0.00 -0.17 0.29 0.06 1.00
File:001-001-12.12.16-13.01.25.csv. Person:1. Canal:2. There are 6 actions. Below Correlation Matrix
1 2 3 4 5 6
1 1.00 0.15 0.16 -0.08 -0.11 0.00
2 0.15 1.00 0.07 0.01 0.06 -0.02
3 0.16 0.07 1.00 0.05 -0.08 -0.05
4 -0.08 0.01 0.05 1.00 -0.02 0.22
5 -0.11 0.06 -0.08 -0.02 1.00 -0.02
6 0.00 -0.02 -0.05 0.22 -0.02 1.00
File:001-001-12.12.16-13.01.25.csv. Person:1. Canal:3. There are 6 actions. Below Correlation Matrix
1 2 3 4 5 6
1 1.00 0.16 -0.16 0.05 -0.05 -0.05
2 0.16 1.00 0.12 0.06 0.06 0.16
3 -0.16 0.12 1.00 0.03 0.09 0.05
4 0.05 0.06 0.03 1.00 0.01 0.03
5 -0.05 0.06 0.09 0.01 1.00 0.01
6 -0.05 0.16 0.05 0.03 0.01 1.00
File:001-001-12.12.16-13.01.25.csv. Person:1. Canal:4. There are 6 actions. Below Correlation Matrix
1 2 3 4 5 6
1 1.00 0.03 -0.02 0.01 -0.13 0.18
2 0.03 1.00 -0.03 -0.10 -0.02 -0.02
3 -0.02 -0.03 1.00 -0.19 -0.07 -0.10
4 0.01 -0.10 -0.19 1.00 0.24 0.03
5 -0.13 -0.02 -0.07 0.24 1.00 0.10
6 0.18 -0.02 -0.10 0.03 0.10 1.00
File:001-001-12.12.16-13.01.25.csv. Person:1. Canal:5. There are 6 actions. Below Correlation Matrix
1 2 3 4 5 6
1 1.00 -0.01 -0.07 0.04 -0.08 0.22
2 -0.01 1.00 0.03 0.03 -0.13 0.05
3 -0.07 0.03 1.00 0.11 -0.10 -0.01
4 0.04 0.03 0.11 1.00 -0.07 -0.08
5 -0.08 -0.13 -0.10 -0.07 1.00 0.07
6 0.22 0.05 -0.01 -0.08 0.07 1.00
File:001-001-12.12.16-13.01.25.csv. Person:1. Canal:6. There are 6 actions. Below Correlation Matrix
1 2 3 4 5 6
1 1.00 -0.02 -0.10 0.00 -0.04 -0.16
2 -0.02 1.00 0.04 0.08 -0.07 0.04
3 -0.10 0.04 1.00 0.21 -0.07 0.21
4 0.00 0.08 0.21 1.00 0.03 0.14
5 -0.04 -0.07 -0.07 0.03 1.00 -0.16
6 -0.16 0.04 0.21 0.14 -0.16 1.00
File:001-001-12.12.16-13.01.25.csv. Person:1. Canal:7. There are 6 actions. Below Correlation Matrix
1 2 3 4 5 6
1 1.00 0.06 -0.14 -0.07 -0.03 0.08
2 0.06 1.00 -0.03 -0.06 0.02 -0.03
3 -0.14 -0.03 1.00 -0.17 0.07 -0.04
4 -0.07 -0.06 -0.17 1.00 0.14 0.06
5 -0.03 0.02 0.07 0.14 1.00 0.04
6 0.08 -0.03 -0.04 0.06 0.04 1.00
File:001-001-12.12.16-13.01.25.csv. Person:1. Canal:8. There are 6 actions. Below Correlation Matrix
1 2 3 4 5 6
1 1.00 0.02 0.03 -0.01 0.06 -0.00
2 0.02 1.00 -0.05 -0.01 -0.04 0.06
3 0.03 -0.05 1.00 -0.00 -0.12 -0.02
4 -0.01 -0.01 -0.00 1.00 0.03 -0.14
5 0.06 -0.04 -0.12 0.03 1.00 -0.05
6 -0.00 0.06 -0.02 -0.14 -0.05 1.00
File:001-001-12.12.16-13.01.25.csv. Person:1. Canal:9. There are 6 actions. Below Correlation Matrix
1 2 3 4 5 6
1 1.00 0.13 -0.00 0.00 -0.02 -0.03
2 0.13 1.00 0.01 -0.01 0.01 -0.01
3 -0.00 0.01 1.00 -0.00 0.01 -0.00
4 0.00 -0.01 -0.00 1.00 0.01 -0.01
5 -0.02 0.01 0.01 0.01 1.00 -0.01
6 -0.03 -0.01 -0.00 -0.01 -0.01 1.00
File:001-001-12.12.16-13.01.25.csv. Person:1. Canal:10. There are 6 actions. Below Correlation Matrix
1 2 3 4 5 6
1 1.00 0.18 0.04 -0.05 -0.02 -0.08
2 0.18 1.00 0.06 -0.06 0.05 0.02
3 0.04 0.06 1.00 -0.05 0.03 -0.06
4 -0.05 -0.06 -0.05 1.00 -0.02 -0.09
5 -0.02 0.05 0.03 -0.02 1.00 0.00
6 -0.08 0.02 -0.06 -0.09 0.00 1.00
File:001-001-12.12.16-13.01.25.csv. Person:1. Canal:11. There are 6 actions. Below Correlation Matrix
1 2 3 4 5 6
1 1.00 0.34 0.00 -0.06 -0.08 -0.07
2 0.34 1.00 -0.10 -0.11 0.02 -0.02
3 0.00 -0.10 1.00 0.04 0.04 -0.12
4 -0.06 -0.11 0.04 1.00 -0.01 -0.10
5 -0.08 0.02 0.04 -0.01 1.00 -0.04
6 -0.07 -0.02 -0.12 -0.10 -0.04 1.00
File:001-001-12.12.16-13.01.25.csv. Person:1. Canal:12. There are 6 actions. Below Correlation Matrix
1 2 3 4 5 6
1 1.00 0.39 0.12 -0.06 0.00 -0.04
2 0.39 1.00 0.05 -0.00 0.03 -0.01
3 0.12 0.05 1.00 -0.03 -0.01 -0.19
4 -0.06 -0.00 -0.03 1.00 -0.04 0.18
5 0.00 0.03 -0.01 -0.04 1.00 0.08
6 -0.04 -0.01 -0.19 0.18 0.08 1.00
File:001-001-12.12.16-13.01.25.csv. Person:1. Canal:13. There are 6 actions. Below Correlation Matrix
1 2 3 4 5 6
1 1.00 -0.04 0.04 -0.03 -0.04 -0.37
2 -0.04 1.00 0.04 0.02 0.01 0.08
3 0.04 0.04 1.00 0.01 -0.01 -0.12
4 -0.03 0.02 0.01 1.00 0.05 -0.02
5 -0.04 0.01 -0.01 0.05 1.00 -0.04
6 -0.37 0.08 -0.12 -0.02 -0.04 1.00
File:001-001-12.12.16-13.01.25.csv. Person:1. Canal:14. There are 6 actions. Below Correlation Matrix
1 2 3 4 5 6
1 1.00 0.21 0.07 -0.08 -0.06 -0.11
2 0.21 1.00 0.04 0.02 -0.17 -0.02
3 0.07 0.04 1.00 0.07 -0.06 -0.11
4 -0.08 0.02 0.07 1.00 -0.02 0.20
5 -0.06 -0.17 -0.06 -0.02 1.00 0.08
6 -0.11 -0.02 -0.11 0.20 0.08 1.00
File:002-002-15.12.16-11.28.27.csv. Person:1. Canal:1. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.08 0.10 -0.19 -0.12 -0.08 -0.07
2 0.08 1.00 -0.02 0.04 -0.06 -0.00 0.09
3 0.10 -0.02 1.00 -0.02 -0.04 -0.17 -0.02
4 -0.19 0.04 -0.02 1.00 0.04 0.29 0.05
5 -0.12 -0.06 -0.04 0.04 1.00 0.06 0.03
6 -0.08 -0.00 -0.17 0.29 0.06 1.00 0.01
7 -0.07 0.09 -0.02 0.05 0.03 0.01 1.00
File:002-002-15.12.16-11.28.27.csv. Person:1. Canal:2. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.15 0.16 -0.08 -0.11 0.00 0.00
2 0.15 1.00 0.08 0.01 0.06 -0.02 -0.01
3 0.16 0.08 1.00 0.05 -0.08 -0.05 0.02
4 -0.08 0.01 0.05 1.00 -0.02 0.22 0.05
5 -0.11 0.06 -0.08 -0.02 1.00 -0.02 -0.05
6 0.00 -0.02 -0.05 0.22 -0.02 1.00 -0.20
7 0.00 -0.01 0.02 0.05 -0.05 -0.20 1.00
File:002-002-15.12.16-11.28.27.csv. Person:1. Canal:3. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.16 -0.16 0.05 -0.05 -0.05 -0.02
2 0.16 1.00 0.12 0.06 0.06 0.16 0.15
3 -0.16 0.12 1.00 0.03 0.09 0.05 0.02
4 0.05 0.06 0.03 1.00 0.01 0.03 0.01
5 -0.05 0.06 0.09 0.01 1.00 0.01 -0.03
6 -0.05 0.16 0.05 0.03 0.01 1.00 0.08
7 -0.02 0.15 0.02 0.01 -0.03 0.08 1.00
File:002-002-15.12.16-11.28.27.csv. Person:1. Canal:4. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.03 -0.02 0.01 -0.13 0.18 0.12
2 0.03 1.00 -0.03 -0.10 -0.02 -0.02 0.13
3 -0.02 -0.03 1.00 -0.19 -0.07 -0.10 -0.18
4 0.01 -0.10 -0.19 1.00 0.24 0.03 0.21
5 -0.13 -0.02 -0.07 0.24 1.00 0.10 0.03
6 0.18 -0.02 -0.10 0.03 0.10 1.00 0.06
7 0.12 0.13 -0.18 0.21 0.03 0.06 1.00
File:002-002-15.12.16-11.28.27.csv. Person:1. Canal:5. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.01 -0.07 0.04 -0.08 0.22 -0.11
2 -0.01 1.00 0.03 0.03 -0.12 0.05 -0.08
3 -0.07 0.03 1.00 0.11 -0.10 -0.01 -0.01
4 0.04 0.03 0.11 1.00 -0.07 -0.08 -0.08
5 -0.08 -0.12 -0.10 -0.07 1.00 0.07 -0.03
6 0.22 0.05 -0.01 -0.08 0.07 1.00 -0.10
7 -0.11 -0.08 -0.01 -0.08 -0.03 -0.10 1.00
File:002-002-15.12.16-11.28.27.csv. Person:1. Canal:6. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.02 -0.10 0.00 -0.04 -0.16 0.03
2 -0.02 1.00 0.04 0.09 -0.08 0.04 -0.07
3 -0.10 0.04 1.00 0.21 -0.07 0.21 0.02
4 0.00 0.09 0.21 1.00 0.03 0.15 -0.16
5 -0.04 -0.08 -0.07 0.03 1.00 -0.16 0.00
6 -0.16 0.04 0.21 0.15 -0.16 1.00 0.15
7 0.03 -0.07 0.02 -0.16 0.00 0.15 1.00
File:002-002-15.12.16-11.28.27.csv. Person:1. Canal:7. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.06 -0.14 -0.07 -0.03 0.08 -0.04
2 0.06 1.00 -0.03 -0.06 0.02 -0.03 0.02
3 -0.14 -0.03 1.00 -0.17 0.07 -0.04 -0.09
4 -0.07 -0.06 -0.17 1.00 0.14 0.06 0.13
5 -0.03 0.02 0.07 0.14 1.00 0.04 -0.01
6 0.08 -0.03 -0.04 0.06 0.04 1.00 -0.09
7 -0.04 0.02 -0.09 0.13 -0.01 -0.09 1.00
File:002-002-15.12.16-11.28.27.csv. Person:1. Canal:8. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.02 0.03 -0.01 0.06 -0.00 -0.07
2 0.02 1.00 -0.05 -0.01 -0.04 0.06 -0.05
3 0.03 -0.05 1.00 -0.00 -0.12 -0.02 0.06
4 -0.01 -0.01 -0.00 1.00 0.03 -0.14 -0.14
5 0.06 -0.04 -0.12 0.03 1.00 -0.05 -0.06
6 -0.00 0.06 -0.02 -0.14 -0.05 1.00 -0.15
7 -0.07 -0.05 0.06 -0.14 -0.06 -0.15 1.00
File:002-002-15.12.16-11.28.27.csv. Person:1. Canal:9. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.14 -0.00 0.00 -0.02 -0.03 -0.01
2 0.14 1.00 0.01 -0.01 0.01 -0.01 0.02
3 -0.00 0.01 1.00 -0.01 0.01 -0.00 0.02
4 0.00 -0.01 -0.01 1.00 0.01 -0.01 -0.03
5 -0.02 0.01 0.01 0.01 1.00 -0.01 -0.01
6 -0.03 -0.01 -0.00 -0.01 -0.01 1.00 0.01
7 -0.01 0.02 0.02 -0.03 -0.01 0.01 1.00
File:002-002-15.12.16-11.28.27.csv. Person:1. Canal:10. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.18 0.04 -0.05 -0.02 -0.08 -0.10
2 0.18 1.00 0.06 -0.06 0.05 0.02 0.03
3 0.04 0.06 1.00 -0.05 0.03 -0.06 -0.01
4 -0.05 -0.06 -0.05 1.00 -0.02 -0.09 -0.17
5 -0.02 0.05 0.03 -0.02 1.00 0.00 -0.13
6 -0.08 0.02 -0.06 -0.09 0.00 1.00 -0.00
7 -0.10 0.03 -0.01 -0.17 -0.13 -0.00 1.00
File:002-002-15.12.16-11.28.27.csv. Person:1. Canal:11. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.34 0.00 -0.06 -0.07 -0.07 -0.01
2 0.34 1.00 -0.10 -0.11 0.02 -0.02 -0.07
3 0.00 -0.10 1.00 0.04 0.04 -0.12 -0.10
4 -0.06 -0.11 0.04 1.00 -0.01 -0.10 0.08
5 -0.07 0.02 0.04 -0.01 1.00 -0.04 0.04
6 -0.07 -0.02 -0.12 -0.10 -0.04 1.00 0.03
7 -0.01 -0.07 -0.10 0.08 0.04 0.03 1.00
File:002-002-15.12.16-11.28.27.csv. Person:1. Canal:12. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.39 0.12 -0.06 0.00 -0.04 -0.15
2 0.39 1.00 0.05 -0.00 0.03 -0.01 -0.08
3 0.12 0.05 1.00 -0.03 -0.01 -0.19 -0.09
4 -0.06 -0.00 -0.03 1.00 -0.04 0.18 0.10
5 0.00 0.03 -0.01 -0.04 1.00 0.08 -0.05
6 -0.04 -0.01 -0.19 0.18 0.08 1.00 -0.03
7 -0.15 -0.08 -0.09 0.10 -0.05 -0.03 1.00
File:002-002-15.12.16-11.28.27.csv. Person:1. Canal:13. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.04 0.05 -0.03 -0.04 -0.37 -0.00
2 -0.04 1.00 0.04 0.02 0.01 0.08 -0.04
3 0.05 0.04 1.00 0.01 -0.01 -0.12 -0.02
4 -0.03 0.02 0.01 1.00 0.05 -0.02 -0.01
5 -0.04 0.01 -0.01 0.05 1.00 -0.04 0.01
6 -0.37 0.08 -0.12 -0.02 -0.04 1.00 -0.10
7 -0.00 -0.04 -0.02 -0.01 0.01 -0.10 1.00
File:002-002-15.12.16-11.28.27.csv. Person:1. Canal:14. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.21 0.07 -0.08 -0.06 -0.11 -0.21
2 0.21 1.00 0.04 0.02 -0.17 -0.02 0.05
3 0.07 0.04 1.00 0.07 -0.06 -0.11 -0.03
4 -0.08 0.02 0.07 1.00 -0.02 0.20 0.08
5 -0.06 -0.17 -0.06 -0.02 1.00 0.08 -0.07
6 -0.11 -0.02 -0.11 0.20 0.08 1.00 0.06
7 -0.21 0.05 -0.03 0.08 -0.07 0.06 1.00
File:001-001-12.12.16-13.01.25.csv. Person:2. Canal:1. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.08 0.10 -0.19 -0.12 -0.08 -0.07
2 0.08 1.00 -0.02 0.04 -0.06 -0.00 0.09
3 0.10 -0.02 1.00 -0.02 -0.04 -0.17 -0.02
4 -0.19 0.04 -0.02 1.00 0.04 0.29 0.05
5 -0.12 -0.06 -0.04 0.04 1.00 0.06 0.03
6 -0.08 -0.00 -0.17 0.29 0.06 1.00 0.01
7 -0.07 0.09 -0.02 0.05 0.03 0.01 1.00
File:001-001-12.12.16-13.01.25.csv. Person:2. Canal:2. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.15 0.16 -0.08 -0.11 0.00 0.00
2 0.15 1.00 0.08 0.01 0.06 -0.02 -0.01
3 0.16 0.08 1.00 0.05 -0.08 -0.05 0.02
4 -0.08 0.01 0.05 1.00 -0.02 0.22 0.05
5 -0.11 0.06 -0.08 -0.02 1.00 -0.02 -0.05
6 0.00 -0.02 -0.05 0.22 -0.02 1.00 -0.20
7 0.00 -0.01 0.02 0.05 -0.05 -0.20 1.00
File:001-001-12.12.16-13.01.25.csv. Person:2. Canal:3. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.16 -0.16 0.05 -0.05 -0.05 -0.02
2 0.16 1.00 0.12 0.06 0.06 0.16 0.15
3 -0.16 0.12 1.00 0.03 0.09 0.05 0.02
4 0.05 0.06 0.03 1.00 0.01 0.03 0.01
5 -0.05 0.06 0.09 0.01 1.00 0.01 -0.03
6 -0.05 0.16 0.05 0.03 0.01 1.00 0.08
7 -0.02 0.15 0.02 0.01 -0.03 0.08 1.00
File:001-001-12.12.16-13.01.25.csv. Person:2. Canal:4. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.03 -0.02 0.01 -0.13 0.18 0.12
2 0.03 1.00 -0.03 -0.10 -0.02 -0.02 0.13
3 -0.02 -0.03 1.00 -0.19 -0.07 -0.10 -0.18
4 0.01 -0.10 -0.19 1.00 0.24 0.03 0.21
5 -0.13 -0.02 -0.07 0.24 1.00 0.10 0.03
6 0.18 -0.02 -0.10 0.03 0.10 1.00 0.06
7 0.12 0.13 -0.18 0.21 0.03 0.06 1.00
File:001-001-12.12.16-13.01.25.csv. Person:2. Canal:5. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.01 -0.07 0.04 -0.08 0.22 -0.11
2 -0.01 1.00 0.03 0.03 -0.12 0.05 -0.08
3 -0.07 0.03 1.00 0.11 -0.10 -0.01 -0.01
4 0.04 0.03 0.11 1.00 -0.07 -0.08 -0.08
5 -0.08 -0.12 -0.10 -0.07 1.00 0.07 -0.03
6 0.22 0.05 -0.01 -0.08 0.07 1.00 -0.10
7 -0.11 -0.08 -0.01 -0.08 -0.03 -0.10 1.00
File:001-001-12.12.16-13.01.25.csv. Person:2. Canal:6. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.02 -0.10 0.00 -0.04 -0.16 0.03
2 -0.02 1.00 0.04 0.09 -0.08 0.04 -0.07
3 -0.10 0.04 1.00 0.21 -0.07 0.21 0.02
4 0.00 0.09 0.21 1.00 0.03 0.15 -0.16
5 -0.04 -0.08 -0.07 0.03 1.00 -0.16 0.00
6 -0.16 0.04 0.21 0.15 -0.16 1.00 0.15
7 0.03 -0.07 0.02 -0.16 0.00 0.15 1.00
File:001-001-12.12.16-13.01.25.csv. Person:2. Canal:7. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.06 -0.14 -0.07 -0.03 0.08 -0.04
2 0.06 1.00 -0.03 -0.06 0.02 -0.03 0.02
3 -0.14 -0.03 1.00 -0.17 0.07 -0.04 -0.09
4 -0.07 -0.06 -0.17 1.00 0.14 0.06 0.13
5 -0.03 0.02 0.07 0.14 1.00 0.04 -0.01
6 0.08 -0.03 -0.04 0.06 0.04 1.00 -0.09
7 -0.04 0.02 -0.09 0.13 -0.01 -0.09 1.00
File:001-001-12.12.16-13.01.25.csv. Person:2. Canal:8. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.02 0.03 -0.01 0.06 -0.00 -0.07
2 0.02 1.00 -0.05 -0.01 -0.04 0.06 -0.05
3 0.03 -0.05 1.00 -0.00 -0.12 -0.02 0.06
4 -0.01 -0.01 -0.00 1.00 0.03 -0.14 -0.14
5 0.06 -0.04 -0.12 0.03 1.00 -0.05 -0.06
6 -0.00 0.06 -0.02 -0.14 -0.05 1.00 -0.15
7 -0.07 -0.05 0.06 -0.14 -0.06 -0.15 1.00
File:001-001-12.12.16-13.01.25.csv. Person:2. Canal:9. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.14 -0.00 0.00 -0.02 -0.03 -0.01
2 0.14 1.00 0.01 -0.01 0.01 -0.01 0.02
3 -0.00 0.01 1.00 -0.01 0.01 -0.00 0.02
4 0.00 -0.01 -0.01 1.00 0.01 -0.01 -0.03
5 -0.02 0.01 0.01 0.01 1.00 -0.01 -0.01
6 -0.03 -0.01 -0.00 -0.01 -0.01 1.00 0.01
7 -0.01 0.02 0.02 -0.03 -0.01 0.01 1.00
File:001-001-12.12.16-13.01.25.csv. Person:2. Canal:10. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.18 0.04 -0.05 -0.02 -0.08 -0.10
2 0.18 1.00 0.06 -0.06 0.05 0.02 0.03
3 0.04 0.06 1.00 -0.05 0.03 -0.06 -0.01
4 -0.05 -0.06 -0.05 1.00 -0.02 -0.09 -0.17
5 -0.02 0.05 0.03 -0.02 1.00 0.00 -0.13
6 -0.08 0.02 -0.06 -0.09 0.00 1.00 -0.00
7 -0.10 0.03 -0.01 -0.17 -0.13 -0.00 1.00
File:001-001-12.12.16-13.01.25.csv. Person:2. Canal:11. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.34 0.00 -0.06 -0.07 -0.07 -0.01
2 0.34 1.00 -0.10 -0.11 0.03 -0.02 -0.07
3 0.00 -0.10 1.00 0.04 0.04 -0.12 -0.10
4 -0.06 -0.11 0.04 1.00 -0.01 -0.10 0.08
5 -0.07 0.03 0.04 -0.01 1.00 -0.04 0.04
6 -0.07 -0.02 -0.12 -0.10 -0.04 1.00 0.03
7 -0.01 -0.07 -0.10 0.08 0.04 0.03 1.00
File:001-001-12.12.16-13.01.25.csv. Person:2. Canal:12. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.39 0.12 -0.06 0.00 -0.04 -0.15
2 0.39 1.00 0.05 -0.00 0.03 -0.01 -0.08
3 0.12 0.05 1.00 -0.03 -0.01 -0.19 -0.09
4 -0.06 -0.00 -0.03 1.00 -0.04 0.18 0.10
5 0.00 0.03 -0.01 -0.04 1.00 0.08 -0.05
6 -0.04 -0.01 -0.19 0.18 0.08 1.00 -0.03
7 -0.15 -0.08 -0.09 0.10 -0.05 -0.03 1.00
File:001-001-12.12.16-13.01.25.csv. Person:2. Canal:13. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.04 0.04 -0.03 -0.04 -0.37 -0.00
2 -0.04 1.00 0.04 0.02 0.01 0.08 -0.04
3 0.04 0.04 1.00 0.01 -0.01 -0.12 -0.02
4 -0.03 0.02 0.01 1.00 0.05 -0.02 -0.01
5 -0.04 0.01 -0.01 0.05 1.00 -0.04 0.01
6 -0.37 0.08 -0.12 -0.02 -0.04 1.00 -0.10
7 -0.00 -0.04 -0.02 -0.01 0.01 -0.10 1.00
File:001-001-12.12.16-13.01.25.csv. Person:2. Canal:14. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.21 0.07 -0.08 -0.06 -0.11 -0.21
2 0.21 1.00 0.04 0.02 -0.17 -0.02 0.05
3 0.07 0.04 1.00 0.07 -0.06 -0.11 -0.03
4 -0.08 0.02 0.07 1.00 -0.02 0.20 0.08
5 -0.06 -0.17 -0.06 -0.02 1.00 0.08 -0.07
6 -0.11 -0.02 -0.11 0.20 0.08 1.00 0.06
7 -0.21 0.05 -0.03 0.08 -0.07 0.06 1.00
File:002-002-15.12.16-11.28.27.csv. Person:2. Canal:1. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.08 0.10 -0.19 -0.12 -0.08 -0.07
2 0.08 1.00 -0.02 0.04 -0.06 -0.00 0.09
3 0.10 -0.02 1.00 -0.02 -0.04 -0.17 -0.01
4 -0.19 0.04 -0.02 1.00 0.04 0.29 0.05
5 -0.12 -0.06 -0.04 0.04 1.00 0.06 0.03
6 -0.08 -0.00 -0.17 0.29 0.06 1.00 0.01
7 -0.07 0.09 -0.01 0.05 0.03 0.01 1.00
File:002-002-15.12.16-11.28.27.csv. Person:2. Canal:2. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.15 0.16 -0.08 -0.11 0.00 0.00
2 0.15 1.00 0.08 0.01 0.06 -0.02 -0.01
3 0.16 0.08 1.00 0.05 -0.08 -0.05 0.02
4 -0.08 0.01 0.05 1.00 -0.02 0.22 0.05
5 -0.11 0.06 -0.08 -0.02 1.00 -0.02 -0.05
6 0.00 -0.02 -0.05 0.22 -0.02 1.00 -0.20
7 0.00 -0.01 0.02 0.05 -0.05 -0.20 1.00
File:002-002-15.12.16-11.28.27.csv. Person:2. Canal:3. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.16 -0.16 0.05 -0.05 -0.05 -0.02
2 0.16 1.00 0.12 0.06 0.06 0.16 0.15
3 -0.16 0.12 1.00 0.03 0.09 0.05 0.02
4 0.05 0.06 0.03 1.00 0.01 0.03 0.01
5 -0.05 0.06 0.09 0.01 1.00 0.01 -0.03
6 -0.05 0.16 0.05 0.03 0.01 1.00 0.08
7 -0.02 0.15 0.02 0.01 -0.03 0.08 1.00
File:002-002-15.12.16-11.28.27.csv. Person:2. Canal:4. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.03 -0.02 0.01 -0.13 0.18 0.12
2 0.03 1.00 -0.03 -0.10 -0.02 -0.02 0.13
3 -0.02 -0.03 1.00 -0.19 -0.07 -0.10 -0.18
4 0.01 -0.10 -0.19 1.00 0.24 0.03 0.21
5 -0.13 -0.02 -0.07 0.24 1.00 0.10 0.03
6 0.18 -0.02 -0.10 0.03 0.10 1.00 0.06
7 0.12 0.13 -0.18 0.21 0.03 0.06 1.00
File:002-002-15.12.16-11.28.27.csv. Person:2. Canal:5. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.01 -0.07 0.04 -0.08 0.22 -0.11
2 -0.01 1.00 0.03 0.03 -0.13 0.05 -0.08
3 -0.07 0.03 1.00 0.11 -0.10 -0.01 -0.01
4 0.04 0.03 0.11 1.00 -0.07 -0.08 -0.08
5 -0.08 -0.13 -0.10 -0.07 1.00 0.07 -0.03
6 0.22 0.05 -0.01 -0.08 0.07 1.00 -0.10
7 -0.11 -0.08 -0.01 -0.08 -0.03 -0.10 1.00
File:002-002-15.12.16-11.28.27.csv. Person:2. Canal:6. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.02 -0.10 0.00 -0.04 -0.16 0.03
2 -0.02 1.00 0.04 0.09 -0.08 0.04 -0.07
3 -0.10 0.04 1.00 0.21 -0.07 0.21 0.02
4 0.00 0.09 0.21 1.00 0.03 0.15 -0.16
5 -0.04 -0.08 -0.07 0.03 1.00 -0.16 0.00
6 -0.16 0.04 0.21 0.15 -0.16 1.00 0.15
7 0.03 -0.07 0.02 -0.16 0.00 0.15 1.00
File:002-002-15.12.16-11.28.27.csv. Person:2. Canal:7. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.06 -0.14 -0.07 -0.03 0.08 -0.04
2 0.06 1.00 -0.03 -0.06 0.02 -0.03 0.02
3 -0.14 -0.03 1.00 -0.17 0.07 -0.04 -0.09
4 -0.07 -0.06 -0.17 1.00 0.14 0.06 0.13
5 -0.03 0.02 0.07 0.14 1.00 0.04 -0.01
6 0.08 -0.03 -0.04 0.06 0.04 1.00 -0.09
7 -0.04 0.02 -0.09 0.13 -0.01 -0.09 1.00
File:002-002-15.12.16-11.28.27.csv. Person:2. Canal:8. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.02 0.03 -0.01 0.06 -0.00 -0.07
2 0.02 1.00 -0.05 -0.01 -0.04 0.06 -0.05
3 0.03 -0.05 1.00 -0.00 -0.12 -0.02 0.06
4 -0.01 -0.01 -0.00 1.00 0.03 -0.14 -0.14
5 0.06 -0.04 -0.12 0.03 1.00 -0.05 -0.06
6 -0.00 0.06 -0.02 -0.14 -0.05 1.00 -0.15
7 -0.07 -0.05 0.06 -0.14 -0.06 -0.15 1.00
File:002-002-15.12.16-11.28.27.csv. Person:2. Canal:9. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.14 -0.00 0.00 -0.02 -0.03 -0.01
2 0.14 1.00 0.01 -0.01 0.01 -0.01 0.03
3 -0.00 0.01 1.00 -0.00 0.01 -0.00 0.02
4 0.00 -0.01 -0.00 1.00 0.01 -0.01 -0.03
5 -0.02 0.01 0.01 0.01 1.00 -0.01 -0.01
6 -0.03 -0.01 -0.00 -0.01 -0.01 1.00 0.01
7 -0.01 0.03 0.02 -0.03 -0.01 0.01 1.00
File:002-002-15.12.16-11.28.27.csv. Person:2. Canal:10. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.18 0.04 -0.05 -0.02 -0.08 -0.10
2 0.18 1.00 0.06 -0.06 0.05 0.02 0.03
3 0.04 0.06 1.00 -0.05 0.03 -0.06 -0.01
4 -0.05 -0.06 -0.05 1.00 -0.02 -0.09 -0.17
5 -0.02 0.05 0.03 -0.02 1.00 0.00 -0.13
6 -0.08 0.02 -0.06 -0.09 0.00 1.00 -0.00
7 -0.10 0.03 -0.01 -0.17 -0.13 -0.00 1.00
File:002-002-15.12.16-11.28.27.csv. Person:2. Canal:11. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.34 0.00 -0.06 -0.07 -0.07 -0.01
2 0.34 1.00 -0.10 -0.11 0.02 -0.02 -0.07
3 0.00 -0.10 1.00 0.04 0.04 -0.12 -0.10
4 -0.06 -0.11 0.04 1.00 -0.01 -0.10 0.08
5 -0.07 0.02 0.04 -0.01 1.00 -0.04 0.04
6 -0.07 -0.02 -0.12 -0.10 -0.04 1.00 0.03
7 -0.01 -0.07 -0.10 0.08 0.04 0.03 1.00
File:002-002-15.12.16-11.28.27.csv. Person:2. Canal:12. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.39 0.12 -0.06 0.00 -0.04 -0.15
2 0.39 1.00 0.05 -0.00 0.03 -0.01 -0.08
3 0.12 0.05 1.00 -0.03 -0.01 -0.19 -0.09
4 -0.06 -0.00 -0.03 1.00 -0.04 0.18 0.10
5 0.00 0.03 -0.01 -0.04 1.00 0.08 -0.05
6 -0.04 -0.01 -0.19 0.18 0.08 1.00 -0.03
7 -0.15 -0.08 -0.09 0.10 -0.05 -0.03 1.00
File:002-002-15.12.16-11.28.27.csv. Person:2. Canal:13. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.04 0.05 -0.03 -0.04 -0.37 -0.00
2 -0.04 1.00 0.04 0.02 0.01 0.08 -0.04
3 0.05 0.04 1.00 0.01 -0.01 -0.12 -0.02
4 -0.03 0.02 0.01 1.00 0.05 -0.02 -0.01
5 -0.04 0.01 -0.01 0.05 1.00 -0.04 0.01
6 -0.37 0.08 -0.12 -0.02 -0.04 1.00 -0.10
7 -0.00 -0.04 -0.02 -0.01 0.01 -0.10 1.00
File:002-002-15.12.16-11.28.27.csv. Person:2. Canal:14. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.21 0.07 -0.08 -0.06 -0.11 -0.21
2 0.21 1.00 0.03 0.02 -0.17 -0.02 0.05
3 0.07 0.03 1.00 0.07 -0.06 -0.11 -0.03
4 -0.08 0.02 0.07 1.00 -0.02 0.20 0.08
5 -0.06 -0.17 -0.06 -0.02 1.00 0.08 -0.07
6 -0.11 -0.02 -0.11 0.20 0.08 1.00 0.06
7 -0.21 0.05 -0.03 0.08 -0.07 0.06 1.00
File:001-001-12.12.16-13.01.25.csv. Person:3. Canal:1. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.08 0.10 -0.19 -0.12 -0.08 -0.07
2 0.08 1.00 -0.02 0.04 -0.06 -0.00 0.09
3 0.10 -0.02 1.00 -0.02 -0.04 -0.17 -0.02
4 -0.19 0.04 -0.02 1.00 0.04 0.29 0.05
5 -0.12 -0.06 -0.04 0.04 1.00 0.06 0.03
6 -0.08 -0.00 -0.17 0.29 0.06 1.00 0.01
7 -0.07 0.09 -0.02 0.05 0.03 0.01 1.00
File:001-001-12.12.16-13.01.25.csv. Person:3. Canal:2. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.15 0.16 -0.08 -0.11 0.00 0.00
2 0.15 1.00 0.08 0.01 0.06 -0.02 -0.01
3 0.16 0.08 1.00 0.05 -0.08 -0.05 0.02
4 -0.08 0.01 0.05 1.00 -0.02 0.22 0.05
5 -0.11 0.06 -0.08 -0.02 1.00 -0.02 -0.05
6 0.00 -0.02 -0.05 0.22 -0.02 1.00 -0.20
7 0.00 -0.01 0.02 0.05 -0.05 -0.20 1.00
File:001-001-12.12.16-13.01.25.csv. Person:3. Canal:3. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.16 -0.16 0.05 -0.05 -0.05 -0.02
2 0.16 1.00 0.12 0.06 0.06 0.16 0.15
3 -0.16 0.12 1.00 0.03 0.09 0.05 0.02
4 0.05 0.06 0.03 1.00 0.01 0.03 0.01
5 -0.05 0.06 0.09 0.01 1.00 0.01 -0.03
6 -0.05 0.16 0.05 0.03 0.01 1.00 0.08
7 -0.02 0.15 0.02 0.01 -0.03 0.08 1.00
File:001-001-12.12.16-13.01.25.csv. Person:3. Canal:4. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.03 -0.02 0.01 -0.13 0.18 0.12
2 0.03 1.00 -0.03 -0.10 -0.02 -0.02 0.13
3 -0.02 -0.03 1.00 -0.19 -0.07 -0.10 -0.18
4 0.01 -0.10 -0.19 1.00 0.24 0.03 0.21
5 -0.13 -0.02 -0.07 0.24 1.00 0.10 0.03
6 0.18 -0.02 -0.10 0.03 0.10 1.00 0.06
7 0.12 0.13 -0.18 0.21 0.03 0.06 1.00
File:001-001-12.12.16-13.01.25.csv. Person:3. Canal:5. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.01 -0.07 0.04 -0.08 0.22 -0.11
2 -0.01 1.00 0.03 0.03 -0.13 0.05 -0.08
3 -0.07 0.03 1.00 0.11 -0.10 -0.01 -0.01
4 0.04 0.03 0.11 1.00 -0.07 -0.08 -0.08
5 -0.08 -0.13 -0.10 -0.07 1.00 0.07 -0.03
6 0.22 0.05 -0.01 -0.08 0.07 1.00 -0.10
7 -0.11 -0.08 -0.01 -0.08 -0.03 -0.10 1.00
File:001-001-12.12.16-13.01.25.csv. Person:3. Canal:6. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.02 -0.10 0.00 -0.04 -0.16 0.03
2 -0.02 1.00 0.04 0.09 -0.08 0.04 -0.07
3 -0.10 0.04 1.00 0.21 -0.07 0.21 0.02
4 0.00 0.09 0.21 1.00 0.03 0.14 -0.16
5 -0.04 -0.08 -0.07 0.03 1.00 -0.16 0.00
6 -0.16 0.04 0.21 0.14 -0.16 1.00 0.15
7 0.03 -0.07 0.02 -0.16 0.00 0.15 1.00
File:001-001-12.12.16-13.01.25.csv. Person:3. Canal:7. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.06 -0.14 -0.07 -0.03 0.08 -0.04
2 0.06 1.00 -0.03 -0.06 0.02 -0.03 0.02
3 -0.14 -0.03 1.00 -0.17 0.07 -0.04 -0.09
4 -0.07 -0.06 -0.17 1.00 0.14 0.06 0.13
5 -0.03 0.02 0.07 0.14 1.00 0.04 -0.01
6 0.08 -0.03 -0.04 0.06 0.04 1.00 -0.09
7 -0.04 0.02 -0.09 0.13 -0.01 -0.09 1.00
File:001-001-12.12.16-13.01.25.csv. Person:3. Canal:8. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.02 0.03 -0.01 0.06 -0.00 -0.07
2 0.02 1.00 -0.05 -0.01 -0.04 0.06 -0.05
3 0.03 -0.05 1.00 -0.00 -0.12 -0.02 0.06
4 -0.01 -0.01 -0.00 1.00 0.03 -0.14 -0.14
5 0.06 -0.04 -0.12 0.03 1.00 -0.05 -0.06
6 -0.00 0.06 -0.02 -0.14 -0.05 1.00 -0.15
7 -0.07 -0.05 0.06 -0.14 -0.06 -0.15 1.00
File:001-001-12.12.16-13.01.25.csv. Person:3. Canal:9. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.14 -0.00 0.00 -0.02 -0.03 -0.01
2 0.14 1.00 0.01 -0.01 0.01 -0.01 0.02
3 -0.00 0.01 1.00 -0.01 0.01 -0.00 0.02
4 0.00 -0.01 -0.01 1.00 0.01 -0.01 -0.03
5 -0.02 0.01 0.01 0.01 1.00 -0.01 -0.01
6 -0.03 -0.01 -0.00 -0.01 -0.01 1.00 0.01
7 -0.01 0.02 0.02 -0.03 -0.01 0.01 1.00
File:001-001-12.12.16-13.01.25.csv. Person:3. Canal:10. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.18 0.04 -0.05 -0.02 -0.08 -0.10
2 0.18 1.00 0.06 -0.06 0.05 0.02 0.03
3 0.04 0.06 1.00 -0.05 0.03 -0.06 -0.01
4 -0.05 -0.06 -0.05 1.00 -0.02 -0.09 -0.17
5 -0.02 0.05 0.03 -0.02 1.00 0.00 -0.13
6 -0.08 0.02 -0.06 -0.09 0.00 1.00 -0.00
7 -0.10 0.03 -0.01 -0.17 -0.13 -0.00 1.00
File:001-001-12.12.16-13.01.25.csv. Person:3. Canal:11. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.34 0.00 -0.06 -0.07 -0.07 -0.01
2 0.34 1.00 -0.10 -0.11 0.02 -0.02 -0.07
3 0.00 -0.10 1.00 0.04 0.04 -0.12 -0.10
4 -0.06 -0.11 0.04 1.00 -0.01 -0.10 0.08
5 -0.07 0.02 0.04 -0.01 1.00 -0.04 0.04
6 -0.07 -0.02 -0.12 -0.10 -0.04 1.00 0.03
7 -0.01 -0.07 -0.10 0.08 0.04 0.03 1.00
File:001-001-12.12.16-13.01.25.csv. Person:3. Canal:12. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.39 0.12 -0.06 -0.00 -0.04 -0.15
2 0.39 1.00 0.05 -0.00 0.03 -0.01 -0.08
3 0.12 0.05 1.00 -0.03 -0.01 -0.19 -0.09
4 -0.06 -0.00 -0.03 1.00 -0.04 0.18 0.10
5 -0.00 0.03 -0.01 -0.04 1.00 0.08 -0.05
6 -0.04 -0.01 -0.19 0.18 0.08 1.00 -0.03
7 -0.15 -0.08 -0.09 0.10 -0.05 -0.03 1.00
File:001-001-12.12.16-13.01.25.csv. Person:3. Canal:13. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.04 0.05 -0.03 -0.04 -0.37 -0.00
2 -0.04 1.00 0.04 0.02 0.01 0.08 -0.04
3 0.05 0.04 1.00 0.01 -0.01 -0.12 -0.02
4 -0.03 0.02 0.01 1.00 0.05 -0.02 -0.01
5 -0.04 0.01 -0.01 0.05 1.00 -0.04 0.01
6 -0.37 0.08 -0.12 -0.02 -0.04 1.00 -0.10
7 -0.00 -0.04 -0.02 -0.01 0.01 -0.10 1.00
File:001-001-12.12.16-13.01.25.csv. Person:3. Canal:14. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.21 0.07 -0.08 -0.06 -0.11 -0.21
2 0.21 1.00 0.04 0.02 -0.17 -0.02 0.05
3 0.07 0.04 1.00 0.07 -0.06 -0.11 -0.03
4 -0.08 0.02 0.07 1.00 -0.02 0.20 0.08
5 -0.06 -0.17 -0.06 -0.02 1.00 0.08 -0.07
6 -0.11 -0.02 -0.11 0.20 0.08 1.00 0.06
7 -0.21 0.05 -0.03 0.08 -0.07 0.06 1.00
File:002-002-15.12.16-11.28.27.csv. Person:3. Canal:1. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.08 0.10 -0.19 -0.12 -0.08 -0.07
2 0.08 1.00 -0.02 0.04 -0.06 -0.00 0.09
3 0.10 -0.02 1.00 -0.02 -0.04 -0.17 -0.02
4 -0.19 0.04 -0.02 1.00 0.04 0.29 0.05
5 -0.12 -0.06 -0.04 0.04 1.00 0.06 0.03
6 -0.08 -0.00 -0.17 0.29 0.06 1.00 0.01
7 -0.07 0.09 -0.02 0.05 0.03 0.01 1.00
File:002-002-15.12.16-11.28.27.csv. Person:3. Canal:2. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.15 0.16 -0.08 -0.11 0.00 0.00
2 0.15 1.00 0.08 0.01 0.06 -0.02 -0.01
3 0.16 0.08 1.00 0.05 -0.08 -0.05 0.02
4 -0.08 0.01 0.05 1.00 -0.02 0.22 0.05
5 -0.11 0.06 -0.08 -0.02 1.00 -0.02 -0.05
6 0.00 -0.02 -0.05 0.22 -0.02 1.00 -0.20
7 0.00 -0.01 0.02 0.05 -0.05 -0.20 1.00
File:002-002-15.12.16-11.28.27.csv. Person:3. Canal:3. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.16 -0.16 0.05 -0.05 -0.05 -0.02
2 0.16 1.00 0.12 0.06 0.06 0.16 0.15
3 -0.16 0.12 1.00 0.03 0.09 0.05 0.02
4 0.05 0.06 0.03 1.00 0.01 0.03 0.01
5 -0.05 0.06 0.09 0.01 1.00 0.01 -0.03
6 -0.05 0.16 0.05 0.03 0.01 1.00 0.08
7 -0.02 0.15 0.02 0.01 -0.03 0.08 1.00
File:002-002-15.12.16-11.28.27.csv. Person:3. Canal:4. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.03 -0.02 0.01 -0.13 0.18 0.12
2 0.03 1.00 -0.03 -0.10 -0.02 -0.02 0.13
3 -0.02 -0.03 1.00 -0.19 -0.07 -0.10 -0.18
4 0.01 -0.10 -0.19 1.00 0.24 0.03 0.21
5 -0.13 -0.02 -0.07 0.24 1.00 0.10 0.03
6 0.18 -0.02 -0.10 0.03 0.10 1.00 0.06
7 0.12 0.13 -0.18 0.21 0.03 0.06 1.00
File:002-002-15.12.16-11.28.27.csv. Person:3. Canal:5. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.01 -0.07 0.04 -0.08 0.22 -0.11
2 -0.01 1.00 0.03 0.03 -0.12 0.05 -0.08
3 -0.07 0.03 1.00 0.11 -0.10 -0.01 -0.01
4 0.04 0.03 0.11 1.00 -0.07 -0.08 -0.08
5 -0.08 -0.12 -0.10 -0.07 1.00 0.07 -0.03
6 0.22 0.05 -0.01 -0.08 0.07 1.00 -0.10
7 -0.11 -0.08 -0.01 -0.08 -0.03 -0.10 1.00
File:002-002-15.12.16-11.28.27.csv. Person:3. Canal:6. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.02 -0.10 0.00 -0.04 -0.16 0.03
2 -0.02 1.00 0.04 0.09 -0.08 0.04 -0.07
3 -0.10 0.04 1.00 0.21 -0.07 0.21 0.02
4 0.00 0.09 0.21 1.00 0.03 0.15 -0.16
5 -0.04 -0.08 -0.07 0.03 1.00 -0.16 0.00
6 -0.16 0.04 0.21 0.15 -0.16 1.00 0.15
7 0.03 -0.07 0.02 -0.16 0.00 0.15 1.00
File:002-002-15.12.16-11.28.27.csv. Person:3. Canal:7. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.06 -0.14 -0.07 -0.03 0.08 -0.04
2 0.06 1.00 -0.03 -0.06 0.02 -0.03 0.02
3 -0.14 -0.03 1.00 -0.17 0.07 -0.04 -0.09
4 -0.07 -0.06 -0.17 1.00 0.14 0.06 0.13
5 -0.03 0.02 0.07 0.14 1.00 0.04 -0.01
6 0.08 -0.03 -0.04 0.06 0.04 1.00 -0.09
7 -0.04 0.02 -0.09 0.13 -0.01 -0.09 1.00
File:002-002-15.12.16-11.28.27.csv. Person:3. Canal:8. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.02 0.03 -0.01 0.06 -0.00 -0.07
2 0.02 1.00 -0.05 -0.01 -0.04 0.06 -0.05
3 0.03 -0.05 1.00 -0.00 -0.12 -0.02 0.06
4 -0.01 -0.01 -0.00 1.00 0.03 -0.14 -0.14
5 0.06 -0.04 -0.12 0.03 1.00 -0.05 -0.06
6 -0.00 0.06 -0.02 -0.14 -0.05 1.00 -0.15
7 -0.07 -0.05 0.06 -0.14 -0.06 -0.15 1.00
File:002-002-15.12.16-11.28.27.csv. Person:3. Canal:9. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.14 -0.00 0.00 -0.02 -0.03 -0.01
2 0.14 1.00 0.01 -0.02 0.01 -0.01 0.02
3 -0.00 0.01 1.00 -0.00 0.01 -0.00 0.02
4 0.00 -0.02 -0.00 1.00 0.01 -0.01 -0.03
5 -0.02 0.01 0.01 0.01 1.00 -0.01 -0.01
6 -0.03 -0.01 -0.00 -0.01 -0.01 1.00 0.01
7 -0.01 0.02 0.02 -0.03 -0.01 0.01 1.00
File:002-002-15.12.16-11.28.27.csv. Person:3. Canal:10. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.18 0.04 -0.05 -0.02 -0.08 -0.10
2 0.18 1.00 0.06 -0.06 0.05 0.02 0.03
3 0.04 0.06 1.00 -0.05 0.03 -0.06 -0.01
4 -0.05 -0.06 -0.05 1.00 -0.02 -0.09 -0.17
5 -0.02 0.05 0.03 -0.02 1.00 0.00 -0.13
6 -0.08 0.02 -0.06 -0.09 0.00 1.00 -0.00
7 -0.10 0.03 -0.01 -0.17 -0.13 -0.00 1.00
File:002-002-15.12.16-11.28.27.csv. Person:3. Canal:11. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.34 0.00 -0.06 -0.07 -0.07 -0.01
2 0.34 1.00 -0.10 -0.11 0.02 -0.02 -0.07
3 0.00 -0.10 1.00 0.04 0.04 -0.12 -0.10
4 -0.06 -0.11 0.04 1.00 -0.01 -0.10 0.08
5 -0.07 0.02 0.04 -0.01 1.00 -0.04 0.04
6 -0.07 -0.02 -0.12 -0.10 -0.04 1.00 0.03
7 -0.01 -0.07 -0.10 0.08 0.04 0.03 1.00
File:002-002-15.12.16-11.28.27.csv. Person:3. Canal:12. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.39 0.12 -0.06 -0.00 -0.04 -0.15
2 0.39 1.00 0.05 -0.00 0.03 -0.01 -0.08
3 0.12 0.05 1.00 -0.03 -0.01 -0.19 -0.09
4 -0.06 -0.00 -0.03 1.00 -0.04 0.18 0.10
5 -0.00 0.03 -0.01 -0.04 1.00 0.08 -0.05
6 -0.04 -0.01 -0.19 0.18 0.08 1.00 -0.03
7 -0.15 -0.08 -0.09 0.10 -0.05 -0.03 1.00
File:002-002-15.12.16-11.28.27.csv. Person:3. Canal:13. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.04 0.05 -0.03 -0.04 -0.37 -0.00
2 -0.04 1.00 0.04 0.02 0.01 0.08 -0.04
3 0.05 0.04 1.00 0.01 -0.01 -0.12 -0.02
4 -0.03 0.02 0.01 1.00 0.05 -0.02 -0.01
5 -0.04 0.01 -0.01 0.05 1.00 -0.04 0.01
6 -0.37 0.08 -0.12 -0.02 -0.04 1.00 -0.10
7 -0.00 -0.04 -0.02 -0.01 0.01 -0.10 1.00
File:002-002-15.12.16-11.28.27.csv. Person:3. Canal:14. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.21 0.07 -0.08 -0.06 -0.11 -0.21
2 0.21 1.00 0.04 0.02 -0.17 -0.02 0.05
3 0.07 0.04 1.00 0.07 -0.06 -0.11 -0.03
4 -0.08 0.02 0.07 1.00 -0.02 0.20 0.08
5 -0.06 -0.17 -0.06 -0.02 1.00 0.08 -0.07
6 -0.11 -0.02 -0.11 0.20 0.08 1.00 0.06
7 -0.21 0.05 -0.03 0.08 -0.07 0.06 1.00
File:001-001-12.12.16-13.01.25.csv. Person:4. Canal:1. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.08 0.10 -0.19 -0.12 -0.08 -0.07
2 0.08 1.00 -0.02 0.04 -0.06 -0.00 0.09
3 0.10 -0.02 1.00 -0.02 -0.04 -0.17 -0.02
4 -0.19 0.04 -0.02 1.00 0.04 0.29 0.05
5 -0.12 -0.06 -0.04 0.04 1.00 0.06 0.03
6 -0.08 -0.00 -0.17 0.29 0.06 1.00 0.01
7 -0.07 0.09 -0.02 0.05 0.03 0.01 1.00
File:001-001-12.12.16-13.01.25.csv. Person:4. Canal:2. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.15 0.16 -0.08 -0.11 0.00 0.00
2 0.15 1.00 0.08 0.01 0.06 -0.02 -0.01
3 0.16 0.08 1.00 0.05 -0.08 -0.05 0.02
4 -0.08 0.01 0.05 1.00 -0.02 0.22 0.05
5 -0.11 0.06 -0.08 -0.02 1.00 -0.02 -0.05
6 0.00 -0.02 -0.05 0.22 -0.02 1.00 -0.20
7 0.00 -0.01 0.02 0.05 -0.05 -0.20 1.00
File:001-001-12.12.16-13.01.25.csv. Person:4. Canal:3. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.16 -0.16 0.05 -0.05 -0.05 -0.02
2 0.16 1.00 0.12 0.06 0.06 0.16 0.15
3 -0.16 0.12 1.00 0.03 0.09 0.05 0.02
4 0.05 0.06 0.03 1.00 0.01 0.03 0.01
5 -0.05 0.06 0.09 0.01 1.00 0.01 -0.03
6 -0.05 0.16 0.05 0.03 0.01 1.00 0.08
7 -0.02 0.15 0.02 0.01 -0.03 0.08 1.00
File:001-001-12.12.16-13.01.25.csv. Person:4. Canal:4. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.03 -0.02 0.01 -0.13 0.18 0.12
2 0.03 1.00 -0.03 -0.10 -0.02 -0.02 0.13
3 -0.02 -0.03 1.00 -0.19 -0.07 -0.10 -0.18
4 0.01 -0.10 -0.19 1.00 0.24 0.03 0.21
5 -0.13 -0.02 -0.07 0.24 1.00 0.10 0.03
6 0.18 -0.02 -0.10 0.03 0.10 1.00 0.06
7 0.12 0.13 -0.18 0.21 0.03 0.06 1.00
File:001-001-12.12.16-13.01.25.csv. Person:4. Canal:5. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.01 -0.07 0.04 -0.08 0.22 -0.11
2 -0.01 1.00 0.03 0.03 -0.12 0.05 -0.08
3 -0.07 0.03 1.00 0.11 -0.10 -0.01 -0.01
4 0.04 0.03 0.11 1.00 -0.07 -0.08 -0.08
5 -0.08 -0.12 -0.10 -0.07 1.00 0.07 -0.03
6 0.22 0.05 -0.01 -0.08 0.07 1.00 -0.10
7 -0.11 -0.08 -0.01 -0.08 -0.03 -0.10 1.00
File:001-001-12.12.16-13.01.25.csv. Person:4. Canal:6. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.02 -0.10 0.00 -0.04 -0.16 0.03
2 -0.02 1.00 0.04 0.09 -0.08 0.04 -0.07
3 -0.10 0.04 1.00 0.21 -0.07 0.21 0.02
4 0.00 0.09 0.21 1.00 0.03 0.15 -0.16
5 -0.04 -0.08 -0.07 0.03 1.00 -0.16 0.00
6 -0.16 0.04 0.21 0.15 -0.16 1.00 0.15
7 0.03 -0.07 0.02 -0.16 0.00 0.15 1.00
File:001-001-12.12.16-13.01.25.csv. Person:4. Canal:7. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.06 -0.14 -0.07 -0.03 0.08 -0.04
2 0.06 1.00 -0.03 -0.06 0.02 -0.03 0.02
3 -0.14 -0.03 1.00 -0.17 0.07 -0.04 -0.09
4 -0.07 -0.06 -0.17 1.00 0.14 0.06 0.13
5 -0.03 0.02 0.07 0.14 1.00 0.04 -0.01
6 0.08 -0.03 -0.04 0.06 0.04 1.00 -0.09
7 -0.04 0.02 -0.09 0.13 -0.01 -0.09 1.00
File:001-001-12.12.16-13.01.25.csv. Person:4. Canal:8. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.02 0.03 -0.01 0.06 -0.00 -0.07
2 0.02 1.00 -0.05 -0.01 -0.04 0.06 -0.05
3 0.03 -0.05 1.00 -0.00 -0.12 -0.02 0.06
4 -0.01 -0.01 -0.00 1.00 0.03 -0.14 -0.14
5 0.06 -0.04 -0.12 0.03 1.00 -0.05 -0.06
6 -0.00 0.06 -0.02 -0.14 -0.05 1.00 -0.15
7 -0.07 -0.05 0.06 -0.14 -0.06 -0.15 1.00
File:001-001-12.12.16-13.01.25.csv. Person:4. Canal:9. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.14 -0.00 0.00 -0.02 -0.03 -0.01
2 0.14 1.00 0.01 -0.01 0.01 -0.01 0.02
3 -0.00 0.01 1.00 -0.01 0.01 -0.00 0.02
4 0.00 -0.01 -0.01 1.00 0.01 -0.01 -0.03
5 -0.02 0.01 0.01 0.01 1.00 -0.01 -0.01
6 -0.03 -0.01 -0.00 -0.01 -0.01 1.00 0.01
7 -0.01 0.02 0.02 -0.03 -0.01 0.01 1.00
File:001-001-12.12.16-13.01.25.csv. Person:4. Canal:10. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.18 0.04 -0.05 -0.02 -0.08 -0.10
2 0.18 1.00 0.06 -0.06 0.05 0.02 0.03
3 0.04 0.06 1.00 -0.05 0.03 -0.06 -0.01
4 -0.05 -0.06 -0.05 1.00 -0.02 -0.09 -0.17
5 -0.02 0.05 0.03 -0.02 1.00 0.00 -0.13
6 -0.08 0.02 -0.06 -0.09 0.00 1.00 -0.00
7 -0.10 0.03 -0.01 -0.17 -0.13 -0.00 1.00
File:001-001-12.12.16-13.01.25.csv. Person:4. Canal:11. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.34 0.00 -0.06 -0.07 -0.07 -0.01
2 0.34 1.00 -0.10 -0.11 0.02 -0.02 -0.07
3 0.00 -0.10 1.00 0.04 0.04 -0.12 -0.10
4 -0.06 -0.11 0.04 1.00 -0.01 -0.10 0.08
5 -0.07 0.02 0.04 -0.01 1.00 -0.04 0.04
6 -0.07 -0.02 -0.12 -0.10 -0.04 1.00 0.03
7 -0.01 -0.07 -0.10 0.08 0.04 0.03 1.00
File:001-001-12.12.16-13.01.25.csv. Person:4. Canal:12. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.39 0.12 -0.06 0.00 -0.04 -0.15
2 0.39 1.00 0.05 -0.00 0.03 -0.01 -0.08
3 0.12 0.05 1.00 -0.03 -0.01 -0.19 -0.09
4 -0.06 -0.00 -0.03 1.00 -0.04 0.18 0.10
5 0.00 0.03 -0.01 -0.04 1.00 0.08 -0.05
6 -0.04 -0.01 -0.19 0.18 0.08 1.00 -0.03
7 -0.15 -0.08 -0.09 0.10 -0.05 -0.03 1.00
File:001-001-12.12.16-13.01.25.csv. Person:4. Canal:13. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.04 0.05 -0.03 -0.04 -0.37 -0.00
2 -0.04 1.00 0.04 0.02 0.01 0.08 -0.04
3 0.05 0.04 1.00 0.01 -0.01 -0.12 -0.02
4 -0.03 0.02 0.01 1.00 0.05 -0.02 -0.01
5 -0.04 0.01 -0.01 0.05 1.00 -0.04 0.01
6 -0.37 0.08 -0.12 -0.02 -0.04 1.00 -0.10
7 -0.00 -0.04 -0.02 -0.01 0.01 -0.10 1.00
File:001-001-12.12.16-13.01.25.csv. Person:4. Canal:14. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.21 0.07 -0.08 -0.06 -0.11 -0.21
2 0.21 1.00 0.04 0.02 -0.17 -0.02 0.05
3 0.07 0.04 1.00 0.07 -0.06 -0.11 -0.03
4 -0.08 0.02 0.07 1.00 -0.02 0.20 0.08
5 -0.06 -0.17 -0.06 -0.02 1.00 0.08 -0.07
6 -0.11 -0.02 -0.11 0.20 0.08 1.00 0.06
7 -0.21 0.05 -0.03 0.08 -0.07 0.06 1.00
File:002-002-15.12.16-11.28.27.csv. Person:4. Canal:1. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.08 0.10 -0.19 -0.12 -0.08 -0.07
2 0.08 1.00 -0.02 0.04 -0.06 -0.00 0.09
3 0.10 -0.02 1.00 -0.02 -0.04 -0.17 -0.02
4 -0.19 0.04 -0.02 1.00 0.04 0.29 0.05
5 -0.12 -0.06 -0.04 0.04 1.00 0.06 0.03
6 -0.08 -0.00 -0.17 0.29 0.06 1.00 0.01
7 -0.07 0.09 -0.02 0.05 0.03 0.01 1.00
File:002-002-15.12.16-11.28.27.csv. Person:4. Canal:2. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.15 0.16 -0.08 -0.11 0.00 0.00
2 0.15 1.00 0.08 0.01 0.06 -0.02 -0.01
3 0.16 0.08 1.00 0.05 -0.08 -0.05 0.02
4 -0.08 0.01 0.05 1.00 -0.02 0.22 0.05
5 -0.11 0.06 -0.08 -0.02 1.00 -0.02 -0.05
6 0.00 -0.02 -0.05 0.22 -0.02 1.00 -0.20
7 0.00 -0.01 0.02 0.05 -0.05 -0.20 1.00
File:002-002-15.12.16-11.28.27.csv. Person:4. Canal:3. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.16 -0.16 0.05 -0.05 -0.05 -0.02
2 0.16 1.00 0.12 0.06 0.06 0.16 0.15
3 -0.16 0.12 1.00 0.03 0.09 0.05 0.02
4 0.05 0.06 0.03 1.00 0.01 0.03 0.01
5 -0.05 0.06 0.09 0.01 1.00 0.01 -0.03
6 -0.05 0.16 0.05 0.03 0.01 1.00 0.08
7 -0.02 0.15 0.02 0.01 -0.03 0.08 1.00
File:002-002-15.12.16-11.28.27.csv. Person:4. Canal:4. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.03 -0.02 0.01 -0.13 0.18 0.12
2 0.03 1.00 -0.03 -0.10 -0.02 -0.02 0.13
3 -0.02 -0.03 1.00 -0.19 -0.07 -0.10 -0.18
4 0.01 -0.10 -0.19 1.00 0.24 0.03 0.21
5 -0.13 -0.02 -0.07 0.24 1.00 0.10 0.03
6 0.18 -0.02 -0.10 0.03 0.10 1.00 0.06
7 0.12 0.13 -0.18 0.21 0.03 0.06 1.00
File:002-002-15.12.16-11.28.27.csv. Person:4. Canal:5. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.01 -0.07 0.04 -0.08 0.22 -0.11
2 -0.01 1.00 0.03 0.03 -0.13 0.05 -0.08
3 -0.07 0.03 1.00 0.11 -0.10 -0.01 -0.01
4 0.04 0.03 0.11 1.00 -0.07 -0.08 -0.08
5 -0.08 -0.13 -0.10 -0.07 1.00 0.07 -0.03
6 0.22 0.05 -0.01 -0.08 0.07 1.00 -0.10
7 -0.11 -0.08 -0.01 -0.08 -0.03 -0.10 1.00
File:002-002-15.12.16-11.28.27.csv. Person:4. Canal:6. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.02 -0.10 0.00 -0.04 -0.16 0.03
2 -0.02 1.00 0.04 0.09 -0.08 0.04 -0.07
3 -0.10 0.04 1.00 0.21 -0.07 0.21 0.02
4 0.00 0.09 0.21 1.00 0.03 0.15 -0.16
5 -0.04 -0.08 -0.07 0.03 1.00 -0.16 0.00
6 -0.16 0.04 0.21 0.15 -0.16 1.00 0.15
7 0.03 -0.07 0.02 -0.16 0.00 0.15 1.00
File:002-002-15.12.16-11.28.27.csv. Person:4. Canal:7. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.06 -0.14 -0.07 -0.03 0.08 -0.04
2 0.06 1.00 -0.03 -0.06 0.02 -0.03 0.02
3 -0.14 -0.03 1.00 -0.17 0.07 -0.04 -0.09
4 -0.07 -0.06 -0.17 1.00 0.14 0.06 0.13
5 -0.03 0.02 0.07 0.14 1.00 0.04 -0.01
6 0.08 -0.03 -0.04 0.06 0.04 1.00 -0.09
7 -0.04 0.02 -0.09 0.13 -0.01 -0.09 1.00
File:002-002-15.12.16-11.28.27.csv. Person:4. Canal:8. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.02 0.03 -0.01 0.06 -0.00 -0.07
2 0.02 1.00 -0.05 -0.01 -0.04 0.06 -0.05
3 0.03 -0.05 1.00 -0.00 -0.12 -0.02 0.06
4 -0.01 -0.01 -0.00 1.00 0.03 -0.14 -0.14
5 0.06 -0.04 -0.12 0.03 1.00 -0.05 -0.06
6 -0.00 0.06 -0.02 -0.14 -0.05 1.00 -0.15
7 -0.07 -0.05 0.06 -0.14 -0.06 -0.15 1.00
File:002-002-15.12.16-11.28.27.csv. Person:4. Canal:9. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.14 -0.00 0.00 -0.02 -0.03 -0.01
2 0.14 1.00 0.01 -0.01 0.01 -0.01 0.02
3 -0.00 0.01 1.00 -0.01 0.01 -0.00 0.02
4 0.00 -0.01 -0.01 1.00 0.01 -0.01 -0.03
5 -0.02 0.01 0.01 0.01 1.00 -0.01 -0.01
6 -0.03 -0.01 -0.00 -0.01 -0.01 1.00 0.01
7 -0.01 0.02 0.02 -0.03 -0.01 0.01 1.00
File:002-002-15.12.16-11.28.27.csv. Person:4. Canal:10. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.18 0.04 -0.05 -0.02 -0.08 -0.10
2 0.18 1.00 0.06 -0.06 0.05 0.02 0.03
3 0.04 0.06 1.00 -0.05 0.03 -0.06 -0.01
4 -0.05 -0.06 -0.05 1.00 -0.02 -0.09 -0.17
5 -0.02 0.05 0.03 -0.02 1.00 0.00 -0.13
6 -0.08 0.02 -0.06 -0.09 0.00 1.00 -0.00
7 -0.10 0.03 -0.01 -0.17 -0.13 -0.00 1.00
File:002-002-15.12.16-11.28.27.csv. Person:4. Canal:11. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.34 0.00 -0.06 -0.07 -0.07 -0.01
2 0.34 1.00 -0.10 -0.11 0.02 -0.02 -0.07
3 0.00 -0.10 1.00 0.04 0.04 -0.12 -0.10
4 -0.06 -0.11 0.04 1.00 -0.01 -0.10 0.08
5 -0.07 0.02 0.04 -0.01 1.00 -0.04 0.04
6 -0.07 -0.02 -0.12 -0.10 -0.04 1.00 0.03
7 -0.01 -0.07 -0.10 0.08 0.04 0.03 1.00
File:002-002-15.12.16-11.28.27.csv. Person:4. Canal:12. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.39 0.12 -0.06 0.00 -0.04 -0.15
2 0.39 1.00 0.05 -0.00 0.03 -0.01 -0.08
3 0.12 0.05 1.00 -0.03 -0.01 -0.19 -0.09
4 -0.06 -0.00 -0.03 1.00 -0.04 0.18 0.10
5 0.00 0.03 -0.01 -0.04 1.00 0.08 -0.05
6 -0.04 -0.01 -0.19 0.18 0.08 1.00 -0.03
7 -0.15 -0.08 -0.09 0.10 -0.05 -0.03 1.00
File:002-002-15.12.16-11.28.27.csv. Person:4. Canal:13. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 -0.04 0.05 -0.03 -0.04 -0.37 -0.00
2 -0.04 1.00 0.04 0.02 0.01 0.08 -0.04
3 0.05 0.04 1.00 0.01 -0.01 -0.12 -0.02
4 -0.03 0.02 0.01 1.00 0.05 -0.02 -0.01
5 -0.04 0.01 -0.01 0.05 1.00 -0.04 0.01
6 -0.37 0.08 -0.12 -0.02 -0.04 1.00 -0.10
7 -0.00 -0.04 -0.02 -0.01 0.01 -0.10 1.00
File:002-002-15.12.16-11.28.27.csv. Person:4. Canal:14. There are 7 actions. Below Correlation Matrix
1 2 3 4 5 6 7
1 1.00 0.21 0.07 -0.08 -0.06 -0.11 -0.21
2 0.21 1.00 0.04 0.02 -0.17 -0.02 0.05
3 0.07 0.04 1.00 0.07 -0.06 -0.11 -0.03
4 -0.08 0.02 0.07 1.00 -0.02 0.20 0.08
5 -0.06 -0.17 -0.06 -0.02 1.00 0.08 -0.07
6 -0.11 -0.02 -0.11 0.20 0.08 1.00 0.06
7 -0.21 0.05 -0.03 0.08 -0.07 0.06 1.00
#

Ahora preparamos la estructura de datos para el TrelliscopeJS

#