Analisis de autocorrelacion
library(geoR)
## --------------------------------------------------------------
## Analysis of Geostatistical Data
## For an Introduction to geoR go to http://www.leg.ufpr.br/geoR
## geoR version 1.8-1 (built on 2020-02-08) is now loaded
## --------------------------------------------------------------
library(readxl)
# Analisis de autocorrelacion variable temeperatura
#----- 1. Cargar los datos desde tabla de excel
datos=read_excel("D:/ESPECIALIZACION/SEMESTRE_1/1. Tratamiento de datos/Clase_8_Geoestadistica2/base_cienaga.xls")
datos
## # A tibble: 114 x 6
## Este Norte prof temp sali oxig
## <dbl> <dbl> <dbl> <dbl> <dbl> <dbl>
## 1 976952 1706444 1.75 26.4 29.0 6.34
## 2 970883. 1704880. 1.4 30.3 13.0 9.42
## 3 972704. 1704827. 1.1 30.4 19.2 7.88
## 4 974718 1704874 1.5 28.3 35.0 5.67
## 5 976538 1704874 0.5 27 34.0 5.49
## 6 955344. 1703160. 1.62 26 18.0 5.07
## 7 957298. 1703153. 1.55 26.5 18.8 4.53
## 8 959187. 1703146. 1.41 26.9 15.5 5.51
## 9 961189. 1703130. 0.25 27.5 18.9 6.69
## 10 963090. 1703199. 1.54 29 17.2 8.32
## # ... with 104 more rows
plot(datos[,1:2]) # visualizar coordenadas col 1 y 2 (distribucion espacial)

#----- 2. Convertir datos de la tabla a variables reginalizadas tipo geoR
geodatos=as.geodata(datos,coords.col=1:2,data.col=4) #col 1,2 (x,y), col 4 (variable interes, temperatura)
class(geodatos) # variable regionalizada pq tiene coordenadas y el dato
## [1] "geodata"
plot(geodatos)

#----- 3. Cálculo del semivariagram muestral, confirma si hay autocorrelacion espacial
summary(dist(geodatos$coords)) #dist:distancia euclidiana entre puntos
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 1373 6994 11204 11531 15606 31924
#R/dist mas cercana (min) y mas lejana (max) entre puntos
plot(variog(geodatos,option = "cloud"))
## variog: computing omnidirectional variogram

variograma=variog(geodatos,option = "bin",uvec=seq(0,20000,1500)) # agrupar nube de puntos de 0 a 20000 cada 1500 (dato minimo) (Q3=75%)
## variog: computing omnidirectional variogram
variograma
## $u
## [1] 1500 3000 4500 6000 7500 9000 10500 12000 13500 15000 16500 18000
## [13] 19500
##
## $v
## [1] 0.6501244 1.0682828 1.6100709 2.5685702 3.6511337 4.4781569 5.3035552
## [8] 5.8860615 6.2235025 6.2811187 6.2684335 6.1047854 5.6110906
##
## $n
## [1] 201 198 494 584 688 510 571 650 601 438 316 396 298
##
## $sd
## [1] 1.447806 2.224779 2.572577 3.141565 3.829917 4.250190 4.783688 5.363915
## [9] 5.957448 6.290097 6.294742 6.538931 6.275349
##
## $bins.lim
## [1] 1.000e-12 7.500e+02 2.250e+03 3.750e+03 5.250e+03 6.750e+03 8.250e+03
## [8] 9.750e+03 1.125e+04 1.275e+04 1.425e+04 1.575e+04 1.725e+04 1.875e+04
## [15] 2.025e+04
##
## $ind.bin
## [1] FALSE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE
## [13] TRUE TRUE
##
## $var.mark
## [1] 4.503763
##
## $beta.ols
## [1] 29.43684
##
## $output.type
## [1] "bin"
##
## $max.dist
## [1] 20250
##
## $estimator.type
## [1] "classical"
##
## $n.data
## [1] 114
##
## $lambda
## [1] 1
##
## $trend
## [1] "cte"
##
## $pairs.min
## [1] 2
##
## $nugget.tolerance
## [1] 1e-12
##
## $direction
## [1] "omnidirectional"
##
## $tolerance
## [1] "none"
##
## $uvec
## [1] 0 1500 3000 4500 6000 7500 9000 10500 12000 13500 15000 16500
## [13] 18000 19500
##
## $call
## variog(geodata = geodatos, uvec = seq(0, 20000, 1500), option = "bin")
##
## attr(,"class")
## [1] "variogram"
plot(variograma)

Metodo de simulacion de Montecarlo, comportamiento del semivariograma sino existiera autocorrelacion espacial
#----- 1. Permuto datos originales
geodatos2=as.geodata(datos,coords.col=1:2,data.col=4)
geodatos2$data # datos orden inicial
## [1] 26.4 30.3 30.4 28.3 27.0 26.0 26.5 26.9 27.5 29.0 29.2 31.3 31.3 29.4 30.5
## [16] 31.7 26.2 26.8 27.2 27.8 29.0 29.5 32.5 31.0 31.3 31.0 31.7 26.1 26.2 26.7
## [31] 27.0 27.5 28.6 29.5 30.4 33.1 32.1 32.3 32.4 26.0 26.0 26.6 26.5 27.3 28.1
## [46] 29.2 30.9 33.0 32.3 31.5 26.4 26.3 26.7 27.8 28.1 30.4 30.3 32.4 32.3 33.0
## [61] 29.6 32.1 31.5 30.6 31.3 32.3 31.7 32.2 33.2 31.4 30.8 29.9 31.6 31.7 31.8
## [76] 31.4 31.2 30.2 30.1 31.2 30.8 31.8 31.7 32.0 31.2 30.2 28.2 30.1 30.6 30.4
## [91] 30.8 30.5 28.0 27.3 27.5 28.4 29.0 30.3 27.4 27.5 27.6 27.4 28.4 28.8 27.3
## [106] 27.2 27.0 27.4 28.3 27.1 26.8 27.1 27.9 29.3
geodatos2$data=sample(geodatos2$data) # sample: desordeno los datos inciales (los permuto)
plot(geodatos2)

#----- 2. Cálculo nuevo semivariograma con datos desordenados
variograma2=variog(geodatos2,option = "bin",uvec=seq(0,20000,1500)) # calculo de nuevo el semivariograma con los datos permutados
## variog: computing omnidirectional variogram
plot(variograma2,ylim=c(0,8),type="l")
#----- 3.Calculo del semivariogramas permutado muchas veces
geodatos2=as.geodata(datos,coords.col=1:2,data.col=4)
geodatos2$data=sample(geodatos2$data)
variograma2=variog(geodatos2,option = "bin",uvec=seq(0,20000,1500))
## variog: computing omnidirectional variogram
lines(variograma2,ylim=c(0,8),type="l",add=TRUE)
## Warning in plot.xy(xy.coords(x, y), type = type, ...): "add" is not a graphical
## parameter

#----- 4. cálculo de semivariograma con bandas de no correlacion, referencia para decidir que está pasando con los datos
variograma=variog(geodatos,option = "bin",uvec=seq(0,20000,1500)) #variograma muestral
## variog: computing omnidirectional variogram
variograma
## $u
## [1] 1500 3000 4500 6000 7500 9000 10500 12000 13500 15000 16500 18000
## [13] 19500
##
## $v
## [1] 0.6501244 1.0682828 1.6100709 2.5685702 3.6511337 4.4781569 5.3035552
## [8] 5.8860615 6.2235025 6.2811187 6.2684335 6.1047854 5.6110906
##
## $n
## [1] 201 198 494 584 688 510 571 650 601 438 316 396 298
##
## $sd
## [1] 1.447806 2.224779 2.572577 3.141565 3.829917 4.250190 4.783688 5.363915
## [9] 5.957448 6.290097 6.294742 6.538931 6.275349
##
## $bins.lim
## [1] 1.000e-12 7.500e+02 2.250e+03 3.750e+03 5.250e+03 6.750e+03 8.250e+03
## [8] 9.750e+03 1.125e+04 1.275e+04 1.425e+04 1.575e+04 1.725e+04 1.875e+04
## [15] 2.025e+04
##
## $ind.bin
## [1] FALSE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE
## [13] TRUE TRUE
##
## $var.mark
## [1] 4.503763
##
## $beta.ols
## [1] 29.43684
##
## $output.type
## [1] "bin"
##
## $max.dist
## [1] 20250
##
## $estimator.type
## [1] "classical"
##
## $n.data
## [1] 114
##
## $lambda
## [1] 1
##
## $trend
## [1] "cte"
##
## $pairs.min
## [1] 2
##
## $nugget.tolerance
## [1] 1e-12
##
## $direction
## [1] "omnidirectional"
##
## $tolerance
## [1] "none"
##
## $uvec
## [1] 0 1500 3000 4500 6000 7500 9000 10500 12000 13500 15000 16500
## [13] 18000 19500
##
## $call
## variog(geodata = geodatos, uvec = seq(0, 20000, 1500), option = "bin")
##
## attr(,"class")
## [1] "variogram"
plot(variograma)
variograma_mc=variog.mc.env(geodatos,obj=variograma,nsim=99) # variograma permutado, 99 permutaciones
## variog.env: generating 99 simulations by permutating data values
## variog.env: computing the empirical variogram for the 99 simulations
## variog.env: computing the envelops
lines(variograma_mc,col="red")

Analisis de autocorrelacion espacial con las variables profundidad, salinidad y oxigeno
#----- 1. Calculo autocorrelacion varible de profundidad
geodatos3=as.geodata(datos,coords.col=1:2,data.col=3)
plot(geodatos3)

variograma3=variog(geodatos3,option = "bin",uvec=seq(0,20000,1500))
## variog: computing omnidirectional variogram
variograma3
## $u
## [1] 1500 3000 4500 6000 7500 9000 10500 12000 13500 15000 16500 18000
## [13] 19500
##
## $v
## [1] 0.07622313 0.07528813 0.08130425 0.09212842 0.10436424 0.11241686
## [7] 0.12093161 0.12274400 0.14328835 0.16182112 0.16249256 0.16192399
## [13] 0.19580017
##
## $n
## [1] 201 198 494 584 688 510 571 650 601 438 316 396 298
##
## $sd
## [1] 0.1807356 0.1653980 0.1798145 0.2012412 0.1857909 0.2045572 0.1954690
## [8] 0.1853413 0.1980595 0.2410256 0.2274948 0.2074210 0.2460207
##
## $bins.lim
## [1] 1.000e-12 7.500e+02 2.250e+03 3.750e+03 5.250e+03 6.750e+03 8.250e+03
## [8] 9.750e+03 1.125e+04 1.275e+04 1.425e+04 1.575e+04 1.725e+04 1.875e+04
## [15] 2.025e+04
##
## $ind.bin
## [1] FALSE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE
## [13] TRUE TRUE
##
## $var.mark
## [1] 0.1273035
##
## $beta.ols
## [1] 1.477895
##
## $output.type
## [1] "bin"
##
## $max.dist
## [1] 20250
##
## $estimator.type
## [1] "classical"
##
## $n.data
## [1] 114
##
## $lambda
## [1] 1
##
## $trend
## [1] "cte"
##
## $pairs.min
## [1] 2
##
## $nugget.tolerance
## [1] 1e-12
##
## $direction
## [1] "omnidirectional"
##
## $tolerance
## [1] "none"
##
## $uvec
## [1] 0 1500 3000 4500 6000 7500 9000 10500 12000 13500 15000 16500
## [13] 18000 19500
##
## $call
## variog(geodata = geodatos3, uvec = seq(0, 20000, 1500), option = "bin")
##
## attr(,"class")
## [1] "variogram"
plot(variograma3)
variograma_mc=variog.mc.env(geodatos3,obj=variograma,nsim=99)
## variog.env: generating 99 simulations by permutating data values
## variog.env: computing the empirical variogram for the 99 simulations
## variog.env: computing the envelops
lines(variograma_mc,col="red")

#----- 2. Calculo autocorrelacion varible de salinidad
geodatos4=as.geodata(datos,coords.col=1:2,data.col=5)
plot(geodatos4)

variograma4=variog(geodatos4,option = "bin",uvec=seq(0,20000,1500))
## variog: computing omnidirectional variogram
variograma4
## $u
## [1] 1500 3000 4500 6000 7500 9000 10500 12000 13500 15000 16500 18000
## [13] 19500
##
## $v
## [1] 2.139230 3.323165 3.205625 4.218861 4.155430 5.149708 6.334606
## [8] 5.290376 6.869555 9.191472 11.714082 11.160215 14.239824
##
## $n
## [1] 201 198 494 584 688 510 571 650 601 438 316 396 298
##
## $sd
## [1] 14.64185 20.04953 19.55825 22.52982 19.85200 22.48796 26.39760 22.22508
## [9] 26.67721 31.63044 35.42439 32.96839 36.85020
##
## $bins.lim
## [1] 1.000e-12 7.500e+02 2.250e+03 3.750e+03 5.250e+03 6.750e+03 8.250e+03
## [8] 9.750e+03 1.125e+04 1.275e+04 1.425e+04 1.575e+04 1.725e+04 1.875e+04
## [15] 2.025e+04
##
## $ind.bin
## [1] FALSE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE
## [13] TRUE TRUE
##
## $var.mark
## [1] 8.13333
##
## $beta.ols
## [1] 17.62623
##
## $output.type
## [1] "bin"
##
## $max.dist
## [1] 20250
##
## $estimator.type
## [1] "classical"
##
## $n.data
## [1] 114
##
## $lambda
## [1] 1
##
## $trend
## [1] "cte"
##
## $pairs.min
## [1] 2
##
## $nugget.tolerance
## [1] 1e-12
##
## $direction
## [1] "omnidirectional"
##
## $tolerance
## [1] "none"
##
## $uvec
## [1] 0 1500 3000 4500 6000 7500 9000 10500 12000 13500 15000 16500
## [13] 18000 19500
##
## $call
## variog(geodata = geodatos4, uvec = seq(0, 20000, 1500), option = "bin")
##
## attr(,"class")
## [1] "variogram"
plot(variograma4)
variograma_mc=variog.mc.env(geodatos4,obj=variograma,nsim=99)
## variog.env: generating 99 simulations by permutating data values
## variog.env: computing the empirical variogram for the 99 simulations
## variog.env: computing the envelops
lines(variograma_mc,col="red")

#----- 3. Calculo autocorrelacion varible de oxigeno
geodatos5=as.geodata(datos,coords.col=1:2,data.col=6)
plot(geodatos5)

variograma5=variog(geodatos5,option = "bin",uvec=seq(0,20000,1500))
## variog: computing omnidirectional variogram
variograma5
## $u
## [1] 1500 3000 4500 6000 7500 9000 10500 12000 13500 15000 16500 18000
## [13] 19500
##
## $v
## [1] 2.457994 4.345394 5.867351 8.157443 10.779507 13.014212 14.837986
## [8] 15.244943 14.461641 12.321890 10.883380 8.835865 7.902726
##
## $n
## [1] 201 198 494 584 688 510 571 650 601 438 316 396 298
##
## $sd
## [1] 6.719666 9.602781 10.181169 11.462111 13.052653 14.047790 15.710253
## [8] 16.491714 17.514307 15.138583 13.058776 10.339835 9.420352
##
## $bins.lim
## [1] 1.000e-12 7.500e+02 2.250e+03 3.750e+03 5.250e+03 6.750e+03 8.250e+03
## [8] 9.750e+03 1.125e+04 1.275e+04 1.425e+04 1.575e+04 1.725e+04 1.875e+04
## [15] 2.025e+04
##
## $ind.bin
## [1] FALSE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE TRUE
## [13] TRUE TRUE
##
## $var.mark
## [1] 10.57208
##
## $beta.ols
## [1] 8.805965
##
## $output.type
## [1] "bin"
##
## $max.dist
## [1] 20250
##
## $estimator.type
## [1] "classical"
##
## $n.data
## [1] 114
##
## $lambda
## [1] 1
##
## $trend
## [1] "cte"
##
## $pairs.min
## [1] 2
##
## $nugget.tolerance
## [1] 1e-12
##
## $direction
## [1] "omnidirectional"
##
## $tolerance
## [1] "none"
##
## $uvec
## [1] 0 1500 3000 4500 6000 7500 9000 10500 12000 13500 15000 16500
## [13] 18000 19500
##
## $call
## variog(geodata = geodatos5, uvec = seq(0, 20000, 1500), option = "bin")
##
## attr(,"class")
## [1] "variogram"
plot(variograma5)
variograma_mc=variog.mc.env(geodatos5,obj=variograma,nsim=99)
## variog.env: generating 99 simulations by permutating data values
## variog.env: computing the empirical variogram for the 99 simulations
## variog.env: computing the envelops
lines(variograma_mc,col="red")

#-----Conclusion: las variables adecuadas para hacer interpolaciones temperatura y oxigeno
# la salinidad y profunidad casi no presentan autocorrelacion, profundidad es muy homogenea y la salinidad autocorrelacion bastante debil
Semivariograma Empirico y ajuste Modelo Teórico
#----- 1. Defino parametros
x=1:30
y=5+(2*x)+rnorm(30,sd = 5) # sd:ruido
plot(x,y)
cor(x,y) # correlacion entre x,y
## [1] 0.9602306
#----- 2. Defino el intercepto y la pendiente bo y b1
bo=4
b1=1.5
y_mod=bo+(b1*x)
#----- 3. calculo el error
lines(x,y_mod,col="red")
SCE=sum((y-y_mod)^2)
SCE
## [1] 3846.002
#----- 1. Defino posibles valores de bo y b1
bo=seq(0,10,0.5) # valores entre 0-10 entre 0.5
b1=seq(0,3,0.1) # valores entre 0-3 entre 0.1
params=expand.grid(bo,b1) # expand.grid: combinaciones de valores, posibles parametros
SCE=rep(NA,dim(params)[1]) # SCE: suma del cuadrado del error
total=dim(params)[1]
#----- 2.ciclo para generar varias lineas y a cada una le calcule el SCE
for(i in 1:total){
bo=params[i,1]
b1=params[i,2]
y_mod=bo+(b1*x)
lines(x,y_mod,col="red")
SCE[i]=sum((y-y_mod)^2)
print(i)
}

## [1] 1
## [1] 2
## [1] 3
## [1] 4
## [1] 5
## [1] 6
## [1] 7
## [1] 8
## [1] 9
## [1] 10
## [1] 11
## [1] 12
## [1] 13
## [1] 14
## [1] 15
## [1] 16
## [1] 17
## [1] 18
## [1] 19
## [1] 20
## [1] 21
## [1] 22
## [1] 23
## [1] 24
## [1] 25
## [1] 26
## [1] 27
## [1] 28
## [1] 29
## [1] 30
## [1] 31
## [1] 32
## [1] 33
## [1] 34
## [1] 35
## [1] 36
## [1] 37
## [1] 38
## [1] 39
## [1] 40
## [1] 41
## [1] 42
## [1] 43
## [1] 44
## [1] 45
## [1] 46
## [1] 47
## [1] 48
## [1] 49
## [1] 50
## [1] 51
## [1] 52
## [1] 53
## [1] 54
## [1] 55
## [1] 56
## [1] 57
## [1] 58
## [1] 59
## [1] 60
## [1] 61
## [1] 62
## [1] 63
## [1] 64
## [1] 65
## [1] 66
## [1] 67
## [1] 68
## [1] 69
## [1] 70
## [1] 71
## [1] 72
## [1] 73
## [1] 74
## [1] 75
## [1] 76
## [1] 77
## [1] 78
## [1] 79
## [1] 80
## [1] 81
## [1] 82
## [1] 83
## [1] 84
## [1] 85
## [1] 86
## [1] 87
## [1] 88
## [1] 89
## [1] 90
## [1] 91
## [1] 92
## [1] 93
## [1] 94
## [1] 95
## [1] 96
## [1] 97
## [1] 98
## [1] 99
## [1] 100
## [1] 101
## [1] 102
## [1] 103
## [1] 104
## [1] 105
## [1] 106
## [1] 107
## [1] 108
## [1] 109
## [1] 110
## [1] 111
## [1] 112
## [1] 113
## [1] 114
## [1] 115
## [1] 116
## [1] 117
## [1] 118
## [1] 119
## [1] 120
## [1] 121
## [1] 122
## [1] 123
## [1] 124
## [1] 125
## [1] 126
## [1] 127
## [1] 128
## [1] 129
## [1] 130
## [1] 131
## [1] 132
## [1] 133
## [1] 134
## [1] 135
## [1] 136
## [1] 137
## [1] 138
## [1] 139
## [1] 140
## [1] 141
## [1] 142
## [1] 143
## [1] 144
## [1] 145
## [1] 146
## [1] 147
## [1] 148
## [1] 149
## [1] 150
## [1] 151
## [1] 152
## [1] 153
## [1] 154
## [1] 155
## [1] 156
## [1] 157
## [1] 158
## [1] 159
## [1] 160
## [1] 161
## [1] 162
## [1] 163
## [1] 164
## [1] 165
## [1] 166
## [1] 167
## [1] 168
## [1] 169
## [1] 170
## [1] 171
## [1] 172
## [1] 173
## [1] 174
## [1] 175
## [1] 176
## [1] 177
## [1] 178
## [1] 179
## [1] 180
## [1] 181
## [1] 182
## [1] 183
## [1] 184
## [1] 185
## [1] 186
## [1] 187
## [1] 188
## [1] 189
## [1] 190
## [1] 191
## [1] 192
## [1] 193
## [1] 194
## [1] 195
## [1] 196
## [1] 197
## [1] 198
## [1] 199
## [1] 200
## [1] 201
## [1] 202
## [1] 203
## [1] 204
## [1] 205
## [1] 206
## [1] 207
## [1] 208
## [1] 209
## [1] 210
## [1] 211
## [1] 212
## [1] 213
## [1] 214
## [1] 215
## [1] 216
## [1] 217
## [1] 218
## [1] 219
## [1] 220
## [1] 221
## [1] 222
## [1] 223
## [1] 224
## [1] 225
## [1] 226
## [1] 227
## [1] 228
## [1] 229
## [1] 230
## [1] 231
## [1] 232
## [1] 233
## [1] 234
## [1] 235
## [1] 236
## [1] 237
## [1] 238
## [1] 239
## [1] 240
## [1] 241
## [1] 242
## [1] 243
## [1] 244
## [1] 245
## [1] 246
## [1] 247
## [1] 248
## [1] 249
## [1] 250
## [1] 251
## [1] 252
## [1] 253
## [1] 254
## [1] 255
## [1] 256
## [1] 257
## [1] 258
## [1] 259
## [1] 260
## [1] 261
## [1] 262
## [1] 263
## [1] 264
## [1] 265
## [1] 266
## [1] 267
## [1] 268
## [1] 269
## [1] 270
## [1] 271
## [1] 272
## [1] 273
## [1] 274
## [1] 275
## [1] 276
## [1] 277
## [1] 278
## [1] 279
## [1] 280
## [1] 281
## [1] 282
## [1] 283
## [1] 284
## [1] 285
## [1] 286
## [1] 287
## [1] 288
## [1] 289
## [1] 290
## [1] 291
## [1] 292
## [1] 293
## [1] 294
## [1] 295
## [1] 296
## [1] 297
## [1] 298
## [1] 299
## [1] 300
## [1] 301
## [1] 302
## [1] 303
## [1] 304
## [1] 305
## [1] 306
## [1] 307
## [1] 308
## [1] 309
## [1] 310
## [1] 311
## [1] 312
## [1] 313
## [1] 314
## [1] 315
## [1] 316
## [1] 317
## [1] 318
## [1] 319
## [1] 320
## [1] 321
## [1] 322
## [1] 323
## [1] 324
## [1] 325
## [1] 326
## [1] 327
## [1] 328
## [1] 329
## [1] 330
## [1] 331
## [1] 332
## [1] 333
## [1] 334
## [1] 335
## [1] 336
## [1] 337
## [1] 338
## [1] 339
## [1] 340
## [1] 341
## [1] 342
## [1] 343
## [1] 344
## [1] 345
## [1] 346
## [1] 347
## [1] 348
## [1] 349
## [1] 350
## [1] 351
## [1] 352
## [1] 353
## [1] 354
## [1] 355
## [1] 356
## [1] 357
## [1] 358
## [1] 359
## [1] 360
## [1] 361
## [1] 362
## [1] 363
## [1] 364
## [1] 365
## [1] 366
## [1] 367
## [1] 368
## [1] 369
## [1] 370
## [1] 371
## [1] 372
## [1] 373
## [1] 374
## [1] 375
## [1] 376
## [1] 377
## [1] 378
## [1] 379
## [1] 380
## [1] 381
## [1] 382
## [1] 383
## [1] 384
## [1] 385
## [1] 386
## [1] 387
## [1] 388
## [1] 389
## [1] 390
## [1] 391
## [1] 392
## [1] 393
## [1] 394
## [1] 395
## [1] 396
## [1] 397
## [1] 398
## [1] 399
## [1] 400
## [1] 401
## [1] 402
## [1] 403
## [1] 404
## [1] 405
## [1] 406
## [1] 407
## [1] 408
## [1] 409
## [1] 410
## [1] 411
## [1] 412
## [1] 413
## [1] 414
## [1] 415
## [1] 416
## [1] 417
## [1] 418
## [1] 419
## [1] 420
## [1] 421
## [1] 422
## [1] 423
## [1] 424
## [1] 425
## [1] 426
## [1] 427
## [1] 428
## [1] 429
## [1] 430
## [1] 431
## [1] 432
## [1] 433
## [1] 434
## [1] 435
## [1] 436
## [1] 437
## [1] 438
## [1] 439
## [1] 440
## [1] 441
## [1] 442
## [1] 443
## [1] 444
## [1] 445
## [1] 446
## [1] 447
## [1] 448
## [1] 449
## [1] 450
## [1] 451
## [1] 452
## [1] 453
## [1] 454
## [1] 455
## [1] 456
## [1] 457
## [1] 458
## [1] 459
## [1] 460
## [1] 461
## [1] 462
## [1] 463
## [1] 464
## [1] 465
## [1] 466
## [1] 467
## [1] 468
## [1] 469
## [1] 470
## [1] 471
## [1] 472
## [1] 473
## [1] 474
## [1] 475
## [1] 476
## [1] 477
## [1] 478
## [1] 479
## [1] 480
## [1] 481
## [1] 482
## [1] 483
## [1] 484
## [1] 485
## [1] 486
## [1] 487
## [1] 488
## [1] 489
## [1] 490
## [1] 491
## [1] 492
## [1] 493
## [1] 494
## [1] 495
## [1] 496
## [1] 497
## [1] 498
## [1] 499
## [1] 500
## [1] 501
## [1] 502
## [1] 503
## [1] 504
## [1] 505
## [1] 506
## [1] 507
## [1] 508
## [1] 509
## [1] 510
## [1] 511
## [1] 512
## [1] 513
## [1] 514
## [1] 515
## [1] 516
## [1] 517
## [1] 518
## [1] 519
## [1] 520
## [1] 521
## [1] 522
## [1] 523
## [1] 524
## [1] 525
## [1] 526
## [1] 527
## [1] 528
## [1] 529
## [1] 530
## [1] 531
## [1] 532
## [1] 533
## [1] 534
## [1] 535
## [1] 536
## [1] 537
## [1] 538
## [1] 539
## [1] 540
## [1] 541
## [1] 542
## [1] 543
## [1] 544
## [1] 545
## [1] 546
## [1] 547
## [1] 548
## [1] 549
## [1] 550
## [1] 551
## [1] 552
## [1] 553
## [1] 554
## [1] 555
## [1] 556
## [1] 557
## [1] 558
## [1] 559
## [1] 560
## [1] 561
## [1] 562
## [1] 563
## [1] 564
## [1] 565
## [1] 566
## [1] 567
## [1] 568
## [1] 569
## [1] 570
## [1] 571
## [1] 572
## [1] 573
## [1] 574
## [1] 575
## [1] 576
## [1] 577
## [1] 578
## [1] 579
## [1] 580
## [1] 581
## [1] 582
## [1] 583
## [1] 584
## [1] 585
## [1] 586
## [1] 587
## [1] 588
## [1] 589
## [1] 590
## [1] 591
## [1] 592
## [1] 593
## [1] 594
## [1] 595
## [1] 596
## [1] 597
## [1] 598
## [1] 599
## [1] 600
## [1] 601
## [1] 602
## [1] 603
## [1] 604
## [1] 605
## [1] 606
## [1] 607
## [1] 608
## [1] 609
## [1] 610
## [1] 611
## [1] 612
## [1] 613
## [1] 614
## [1] 615
## [1] 616
## [1] 617
## [1] 618
## [1] 619
## [1] 620
## [1] 621
## [1] 622
## [1] 623
## [1] 624
## [1] 625
## [1] 626
## [1] 627
## [1] 628
## [1] 629
## [1] 630
## [1] 631
## [1] 632
## [1] 633
## [1] 634
## [1] 635
## [1] 636
## [1] 637
## [1] 638
## [1] 639
## [1] 640
## [1] 641
## [1] 642
## [1] 643
## [1] 644
## [1] 645
## [1] 646
## [1] 647
## [1] 648
## [1] 649
## [1] 650
## [1] 651
#----- 3. Data frame con todos los SCE
names(params)=c("b0","b1")
resultados=data.frame(params,SCE)
#----- 4. Graficos de SCE
require(plotly)
## Loading required package: plotly
## Loading required package: ggplot2
##
## Attaching package: 'plotly'
## The following object is masked from 'package:ggplot2':
##
## last_plot
## The following object is masked from 'package:stats':
##
## filter
## The following object is masked from 'package:graphics':
##
## layout
plot_ly(x=resultados[,1],y=resultados[,2],z=resultados[,3])
## No trace type specified:
## Based on info supplied, a 'scatter3d' trace seems appropriate.
## Read more about this trace type -> https://plot.ly/r/reference/#scatter3d
## No scatter3d mode specifed:
## Setting the mode to markers
## Read more about this attribute -> https://plot.ly/r/reference/#scatter-mode
## Warning: `arrange_()` is deprecated as of dplyr 0.7.0.
## Please use `arrange()` instead.
## See vignette('programming') for more help
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_warnings()` to see where this warning was generated.