Preamble

In this preamble, we load the gstlearn library and clean the workspace.

rm(list=ls())
library(gstlearn)
library(ggplot2)
library(ggpubr)
plot.setDefaultGeographic(dims=c(8,8))

We load two data bases:

## Data points
dlfile = "https://soft.minesparis.psl.eu/gstlearn/data/Scotland/Scotland_Temperatures.NF"
fileNF = "Scotland_Temperatures.NF"
download.file(dlfile, fileNF)
dat = Db_createFromNF(fileNF)

## Rename the temperature variable
dat$setName("*temp", "Temperature")

## Target grid
dlfile = "https://soft.minesparis.psl.eu/gstlearn/data/Scotland/Scotland_Elevations.NF"
fileNF = "Scotland_Elevations.NF"
download.file(dlfile, fileNF)
target = DbGrid_createFromNF(fileNF)

The target data base a (grid) map of the elevation across Scotland.

target
## 
## Data Base Grid Characteristics
## ==============================
## 
## Data Base Summary
## -----------------
## File is organized as a regular grid
## Space dimension              = 2
## Number of Columns            = 4
## Maximum Number of UIDs       = 4
## Total number of samples      = 11097
## Number of active samples     = 3092
## 
## Grid characteristics:
## ---------------------
## Origin :     65.000   535.000
## Mesh   :      4.938     4.963
## Number :         81       137
## 
## Variables
## ---------
## Column = 0 - Name = Longitude - Locator = x1
## Column = 1 - Name = Latitude - Locator = x2
## Column = 2 - Name = Elevation - Locator = f1
## Column = 3 - Name = inshore - Locator = sel

Let us plot its content.

ggDefaultGeographic() + plot(target, name_raster="Elevation",
                             show.legend.raster=TRUE,palette="Spectral",
                             legend.name.raster="Elevation (m)")

The dat data base contains 236 (point) samples of two variables across Scotland: elevation and temperature.

dat
## 
## Data Base Characteristics
## =========================
## 
## Data Base Summary
## -----------------
## File is organized as a set of isolated points
## Space dimension              = 2
## Number of Columns            = 5
## Maximum Number of UIDs       = 5
## Total number of samples      = 236
## 
## Variables
## ---------
## Column = 0 - Name = rank - Locator = NA
## Column = 1 - Name = Longitude - Locator = x1
## Column = 2 - Name = Latitude - Locator = x2
## Column = 3 - Name = Elevation - Locator = NA
## Column = 4 - Name = Temperature - Locator = z1

We can use the dbStatisticsPrint function to compute statistics on variables of a Db. We specify

For instance, let us count the number of observations of each variable using the dbStatisticsPrint.

dbStatisticsPrint(dat, names = c("Elevation", "Temperature"), 
                  opers=EStatOption_fromKeys(c("NUM")),
                  flagIso = FALSE, title="Number of observations", radix="")
## 
## Number of observations
## ----------------------
##                 Number
## Elevation          236
## Temperature        151
## NULL

Since the Db dat contains 236 samples, we can conclude that the Elevation variable is defined at every point, but not the Temperature variable. Similarly, we can compute the mean of each variable in the observation data base.

dbStatisticsPrint(dat, names = c("Elevation", "Temperature"), 
                  opers=EStatOption_fromKeys(c("MEAN")),
                  flagIso = FALSE, title="Mean of observations", radix="")
## 
## Mean of observations
## --------------------
##                   Mean
## Elevation      146.441
## Temperature      2.815
## NULL

Finally, we can compute the mean elevation target data base to compare it to the one in the observation data base.

dbStatisticsPrint(target, names = c("Elevation"), 
                  opers=EStatOption_fromKeys(c("MEAN")),
                  flagIso = TRUE, title="Mean", radix="")
## 
## Mean
## ----
##                 Mean
## Elevation    241.152
## NULL

We can then compute the filtered means for the Elevation and Temperature variables as follows:

tab = dbStatisticsMultiT(db=dat, names=c("Elevation", "Temperature"),
                         oper=EStatOption_MEAN(),flagMono = F)
knitr::kable(tab$toTL(), caption= "Mean of observations", digits=3)
Mean of observations
Elevation Temperature
Elevation 146.441 87.974
Temperature 2.815 2.815

As explained above, the first row of the table contains contains means of the Elevation variable. The first one corresponds to the mean of the Elevation variable over all the locations where it is defined, and the second one corresponds to the mean of the Elevation variable over all the location where the Temperature variable is defined. Hence, we see that the points where the temperature is observed have an average elevation (87.97351) that is significantly lower than the average elevation in Scotland (241.152), meaning that they are located at relatively low altitudes within the Scottish landscape.

To confirm that, we plot the points where the temperature is sampled on top of the elevation map of Scotland.

p = ggDefaultGeographic()
p = p + plot.grid(target, name_raster="Elevation",
                  show.legend.raster=TRUE,palette="Spectral",
                  legend.name.raster="Elevation (m)")
p = p + plot.point(dat, name_size="Temperature",
                   sizmin = 0.5, sizmax = 3,
                   show.legend.symbol=TRUE,legend.name.size="°C")
ggPrint(p)

From observing this last plot, it seems like the bigger points (corresponding to high temperatures) are located where the elevation is smaller: this seems to hint (confirm?) that the temperature is negatively correlated with the elevation. To corroborate this, we plot a correlation plot between the two variables.

p = ggplot()
p = p + plot.correlation(dat, name1="Elevation", name2="Temperature", 
                     asPoint=TRUE, flagRegr=TRUE)
p = p + plot.decoration(title="Correlation between Temperature and Elevation")
ggPrint(p)

To end this preamble, we create a “neighborhood” object specifying a unique neighborhood, which we will use throughout the course.

uniqueNeigh = NeighUnique_create()

Multivariate Models and Cokriging

To create and work with multivariate models, we simply need to work with Db objects containing more than one variable with a z locator. All the variables with a z locator will be considered as part of the multivariate model. Then, the same commands as in the monovariate case can be used to create and fit experimental variograms, and to perform (co)kriging predictions.

Let us illustrate our point with our running example. We would like now to consider a bivariate model of the temperature and the elevation. To do so, we simply allocate, in the observation data base dat, a z locator to both variables using the \(setLocators\) method.

dat$setLocators(names=c("Temperature", "Elevation"), 
                locatorType=ELoc_Z())
## NULL
dat
## 
## Data Base Characteristics
## =========================
## 
## Data Base Summary
## -----------------
## File is organized as a set of isolated points
## Space dimension              = 2
## Number of Columns            = 9
## Maximum Number of UIDs       = 9
## Total number of samples      = 236
## 
## Variables
## ---------
## Column = 0 - Name = rank - Locator = NA
## Column = 1 - Name = Longitude - Locator = x1
## Column = 2 - Name = Latitude - Locator = x2
## Column = 3 - Name = Elevation - Locator = z2
## Column = 4 - Name = Temperature - Locator = z1
## Column = 5 - Name = CV_UK.Temperature.esterr - Locator = NA
## Column = 6 - Name = CV_UK.Temperature.stderr - Locator = NA
## Column = 7 - Name = CV_OK.Temperature.esterr - Locator = NA
## Column = 8 - Name = CV_OK.Temperature.stderr - Locator = NA

Fitting a bivariate model

To create experimental (directional) variograms and cross-variograms, we use the same commands as in the monovariate case: since the data base dat now contains two variables with a z locator, the compute method automatically computes both variograms and cross-variograms for these variables.

varioexp2var = Vario_create(varioparam, dat)
err = varioexp2var$compute()

We can then plot the experimental variograms and cross-variograms with a simple command: the plot in the i-th row and j-th column corresponds to the cross-variogram between the variables with locators zi and zj (hence the diagonal plots correspond to the variograms of each variable).

multi.varmod(varioexp2var)

To fit a model on the experimental variograms and cross-variograms, we use the same commands as in the monovariate case.

fitmod2var = Model()
err = fitmod2var$fit(varioexp2var,
                     types=ECov_fromKeys(c("NUGGET","EXPONENTIAL","CUBIC","LINEAR")))
multi.varmod(varioexp2var, fitmod2var)

Cokriging predictions and cross-validation

Since cokriging can be time-consuming in Unique Neighborhood, we create a small moving neighborhood for demonstration.

movingNeigh = NeighMoving_create(radius = 1000, nmaxi = 10)

To perform a cross-validation of the bivariate model using co-kriging, we use the same commands as in the monovariate case. Then cross-validation errors are computed for each variable of the multivariate model (hence for both the Temperature and the Elevation in our case).

err = xvalid(dat, model=fitmod2var,
             neigh=movingNeigh,
             namconv=NamingConvention_create(prefix="CV_COK",flag_locator=FALSE))

We obtain the following Mean Squared Errors for the temperature.

mse=mean(dat$getColumn("CV_COK.Temperature.esterr*")^2,na.rm=TRUE)
cat(c("Mean squared cross-validation error:",
        round(mse,3),
      "\n"))
## Mean squared cross-validation error: 0.281
mse=mean(dat$getColumn("CV_COK.Temperature.stderr*")^2,na.rm=TRUE)
cat(c("Mean squared standardized error:",
        round(mse,3),
      "\n"))
## Mean squared standardized error: 1.254

We obtain the following Mean Squared Errors for the elevation.

mse=mean(dat$getColumn("CV_COK.Elevation.esterr*")^2,na.rm=TRUE)
cat(c("Mean squared cross-validation error:",
        round(mse,3),
      "\n"))
## Mean squared cross-validation error: 17347.961
mse=mean(dat$getColumn("CV_COK.Elevation.stderr*")^2,na.rm=TRUE)
cat(c("Mean squared standardized error:",
        round(mse,3),
      "\n"))
## Mean squared standardized error: 1.179

Similarly, to compute cokriging predictions on the grid, we use the same syntax as in monovariate case: once again, a predictor for each variable in the multivariate model is produced. (Note: we revert back to a unique neighborhood to compare with the predictors previously introduced).

err = kriging(dbin=dat, dbout=target, model=fitmod2var, 
              neigh=uniqueNeigh,
              namconv=NamingConvention_create(prefix="COK"))

We can then represent the cokriging predictor for the temperature.

p = ggDefaultGeographic()
p = p + plot.grid(target,name_raster = "COK.Temp*estim",
                  show.legend.raster = TRUE, 
                  palette="Spectral",legend.name.raster="°C") 
p = p + plot.point(dat,flagCst = T,pch=18,cex=1)
p = p + plot.decoration(title="Temperature - CoKriging")
ggPrint(p)

For this predictor, we get the following statistics:

dbStatisticsPrint(target, names=(c("COK.T*")), opers=opers,
                  title="Statistics on the CoKriging predictions",
                  radix="")
## 
## Statistics on the CoKriging predictions
## ---------------------------------------
##                           Number    Minimum    Maximum       Mean   St. Dev.
## COK.Temperature.estim       3092      0.202      5.242      2.682      0.979
## COK.Temperature.stdev       3092      0.231      0.945      0.448      0.109
## NULL

Finally, we compare the cokriging predictor to the ordinary kriging predictor.

p = ggplot()
p = p + plot.correlation(target, "OK.T*estim", "COK.T*estim", 
                     flagBiss=TRUE, bins=100)
p = p + plot.decoration(xlab="Ordinary Kriging",ylab="CoKriging")
ggPrint(p)

dbStatisticsPrint(target, names=c("OK.T*estim", "COK.T*estim"), opers=opers,
                  title="Comparison between Ordinary and Universal kriging predictions",
                  radix="")
## 
## Comparison between Ordinary and Universal kriging predictions
## -------------------------------------------------------------
##                           Number    Minimum    Maximum       Mean   St. Dev.
## OK.Temperature.estim        3092      0.604      5.083      2.834      0.954
## COK.Temperature.estim       3092      0.202      5.242      2.682      0.979
## NULL

Working with residuals

In this section, we assume that the variable of interest \(Z\) is modeled (at each location \(x\)) as \[ Z(x) = b+a Y(x) + \varepsilon(x)\] where \(Y\) is an auxiliary variable known at every location, \(a\) and \(b\) are some (unknown) regression coefficients, and \(\varepsilon\) denotes stationary residuals. Our goal will be to model and work directly with the residuals \(\varepsilon\) (since they are the one who are assumed to be stationary).

In our running example, the variable of interest \(Z\) will be the temperature, and the auxiliary variable \(Y\) will be the elevation. To compute the coefficients \(a\) and \(b\) of the linear regression between the temperature and the elevation, we can use once again the regression function. We specify the name of response variable (argument name0) and the names of the auxiliary variables (argument names), and set the argument mode=0 to specify that we would like to compute a regression defined from the variables with the specified names. We also set the argument flagCste=TRUE to specify that we are looking for an affine regression model between the variables (i.e. that includes the bias coefficient b).

## Fit regression model
regr = regression(dat, name0="Temperature", names="Elevation", mode=0,
                  flagCste=TRUE)

## Extract coefficients
b = regr$coeffs[1]
a = regr$coeffs[2]

cat(c("Coefficents : b=",round(b,3),"; a=",round(a,5)))
## Coefficents : b= 3.612 ; a= -0.00906

From these regression coefficients obtained above, we can then compute the residuals explicitly as \(\varepsilon(x)=Z(x) - (b+a Y(x) )\). An alternative method consists in using the dbRegression function: this functions fits a regression model, computes the residuals and add them directly on the data base containing the data. The dbRegression function is called in a similar way as the regression function.

In the next example, we compute the residuals of the linear regression between the temperature and the elevation and add them to the observation data base (with a name starting with “RegRes”and without changing the locators in the data base).

err = dbRegression(dat, name0="Temperature", namaux="Elevation", mode=0,
                   flagCste = TRUE,
                   namconv = NamingConvention_create(prefix="RegRes",flag_locator=FALSE))

We then compute some statistics about these residuals.

dbStatisticsPrint(dat, names=c("RegRes*"), opers=opers,
                  title="Statistics on the residuals",
                  radix="")
## 
## Statistics on the residuals
## ---------------------------
##                        Number    Minimum    Maximum       Mean   St. Dev.
## RegRes.Temperature        151     -1.359      1.795      0.000      0.603
## NULL

Finally we plot a correlation plot between the residuals and the regressor variable (i.e. the elevation).

ggplot() + plot.correlation(dat,"Elevation","RegRes*",flagRegr=TRUE,asPoint=TRUE)

Now that the residuals are explicitly computed and available in the observation data base, we can proceed to work with them as with any other variable.

We start by setting their locator to z to specify that they are now our variable of interest within the data base (instead of the raw temperature observations).

dat$setLocator("RegRes*",ELoc_Z(), cleanSameLocator=TRUE)
## NULL

Then we can compute an experimental variogram for the residuals and fit a model on them.

## Compute experimental variogram
varioexpR = Vario(varioparam, dat)
err = varioexpR$compute()

## Fit model
fitmodR = Model()
err = fitmodR$fit(varioexpR,
                  types=ECov_fromKeys(c("NUGGET","SPHERICAL","LINEAR")))
p = ggplot()
p = p + plot.varmod(varioexpR, fitmodR)
p = p + plot.decoration(title="Experimental and fitted variogram models - Temperature Residual")
ggPrint(p)

Finally, we can compute an kriging prediction of the residuals and plot the results.

##  Add constant drift to model to perform ordinary kriging
err = fitmodR$addDrift(Drift1())

## Compute kriging
err = kriging(dbin=dat, dbout=target, model=fitmodR, 
              neigh=uniqueNeigh,
              namconv=NamingConvention_create(prefix="ROK"))
p = ggDefaultGeographic()
p = p + plot.grid(target,name_raster = "ROK*estim",
                  show.legend.raster = TRUE, palette="Spectral",legend.name.raster="°C") 
p = p + plot.point(dat,flagCst = T,pch=18,cex=1)
p = p + plot.decoration(title="Temperature residuals - Ordinary Kriging")
ggPrint(p)

Now that the residuals \(\varepsilon^{OK}\) are predicted everywhere on the grid (by ordinary kriging), we can compute a predictor \(Z^*\) for the temperature by simply adding the back the linear regression part of the model, i.e. by computing

\[ Z^{\star}(x) = b + a Y(x) + \varepsilon^{OK}(x) \] We can compute this predictor by directly manipulating the variables of the target data base.

## Compute temperature predictor
ROK_estim =  b + a * target["Elevation"] + target["ROK*estim"]

## Add it to data base
uid = target$addColumns(ROK_estim,"KR.Temperature.estim")

Let us plot the resulting temperature predictions.

p = ggDefaultGeographic()
p = p + plot.grid(target,name_raster = "KR.T*estim",
                  show.legend.raster = TRUE, palette="Spectral",legend.name.raster="°C") 
p = p + plot.point(dat,flagCst = T,pch=18,cex=1)
p = p + plot.decoration(title="Temperature - Ordinary Kriging of the residuals")
ggPrint(p)

Finally, we compare the predictor obtained by kriging of the residuals to the ordinary kriging predictor.

p = ggplot()
p = p + plot.correlation(target, "OK.T*estim", "KR.T*estim", flagBiss=TRUE, bins=100)
p = p + plot.decoration(xlab="Ordinary Kriging",ylab="Kriging with Residuals")
ggPrint(p)

dbStatisticsPrint(target, names=c("OK.T*estim", "KR.T*estim"), opers=opers,
                  title="Comparison between Ordinary and Residual kriging predictions",
                  radix="")
## 
## Comparison between Ordinary and Residual kriging predictions
## ------------------------------------------------------------
##                          Number    Minimum    Maximum       Mean   St. Dev.
## OK.Temperature.estim       3092      0.604      5.083      2.834      0.954
## KR.Temperature.estim       3092     -8.097      5.108      1.445      1.906
## NULL

Models with External Drifts

In this last section, we investigate how to specify and work with external drifts when modeling data. In a data base, external drifts are identified by allocating a locator f to them in the data bases.

For instance, circling back to our running example, let us assume that we would like to model the temperature with an external drift given by the elevation. Then, in the observation data base, we simply need to allocate a z locator to the temperature variable and a f locator to the elevation variable using the setLocator method. Note: we use the flag cleanSameLocator=TRUE to make sure that only the variable we specify carries the locator.

## Set `z` locator to temperature
err = dat$setLocator("Temperature",ELoc_Z(),
                     cleanSameLocator=TRUE)

## Set `f` locator to elevation
err = dat$setLocator("Elevation",ELoc_F(),
                     cleanSameLocator=TRUE)

Then, defining and fitting the models on the one hand, and performing kriging predictions on the other hand, is done using the same approach as the one described earlier for models with a polynomial trend.

Fitting a model

To create experimental (directional) variograms of the residuals from a model with external drift, we use the same approach as the one described for modeling data with polynomial trends.

First, we create a Model object where we specify that we deal with external drifts. This is once again done through the setDriftIRF function where we specify:

  • the number of external drift variables (argument nfex): this is the number of variables with a f locator the we want to work with
  • the maximal degree of the polynomial trend in the data (argument order): setting order=0 allows to add a constant drift to the model, and setting order to a value \(n\) allows to add all the monomial functions of the coordinates of order up to \(n\) as external drifts (on top of the nfex external drift variables)

Circling back to our example, we create a model with a single external drift (the elevation), and add a constant drift (that basically acts like a bias term).

EDmodel = Model_create()
err = EDmodel$setDriftIRF(order=0,nfex=1)

Then, to compute the experimental variogram, we use the same commands as in the case of polynomial trends: we create a Vario object from the data base containing the data, and call the compute method with the model we just created. The experimental variogram is computed on the residuals obtained after “filtering out” the (linear) effect of the drift variables (and possibly of a polynomial trend if specified in the model).

## Create experimental variogram
varioKED = Vario(varioparam, dat)
err = varioKED$compute(model=EDmodel)

As a reference, we plot the experimental variograms computed on the raw temperature data (dotted lines) and on the residuals from the model with external drift (dashed line).

p = ggplot()
p = p + plot.varmod(vario_raw2dir, linetype="dotted")
p = p + plot.varmod(varioKED, linetype="dashed")
p = p + plot.decoration(title="Temperature (°C)") 
ggPrint(p)

Finally, we fit our model with external drift using the fit method (which we call on the experimental variogram of residuals).

err = EDmodel$fit(varioKED,
                   types=ECov_fromKeys(c("NUGGET","CUBIC","GAUSSIAN")))
p = ggplot()
p = p + plot.varmod(varioKED, EDmodel)
p = p + plot.decoration(title="Experimental and fitted variogram models - Residuals")
ggPrint(p)

Cross-Validation and predictions

To perform a cross-validation or predictions using kriging with External Drifts, we simply call the xvalid and kriging functions with models where external drifts are specified.

For instance, in our example, a cross-validation is performed by calling the xvalid function with the model we just fitted.

err = xvalid(dat, model=EDmodel, 
             neigh=uniqueNeigh,
             namconv=NamingConvention_create(prefix="CV_KED",flag_locator=FALSE))

The mean Mean Squared cross-validation and standardized errors of the resulting kriging predictor are:

mse=mean(dat$getColumn("CV_KED*esterr*")^2,na.rm=TRUE)
cat(c("Mean squared cross-validation error:",
        round(mse,3),
      "\n"))
## Mean squared cross-validation error: 0.172
mse=mean(dat$getColumn("CV_KED*stderr*")^2,na.rm=TRUE)
cat(c("Mean squared standardized error:",
        round(mse,3),
      "\n"))
## Mean squared standardized error: 1.143

Finally, we perform an kriging prediction of the temperature on the target.

err = kriging(dbin=dat, dbout=target, model=EDmodel, 
              neigh=uniqueNeigh,
              namconv=NamingConvention_create(prefix="KED"))
p = ggDefaultGeographic()
p = p + plot.grid(target,name_raster = "KED*estim",
                  show.legend.raster = TRUE, palette="Spectral",legend.name.raster="°C") 
p = p + plot.point(dat,flagCst = T,pch=18,cex=1)
p = p + plot.decoration(title="Temperature - Kriging with external drift")
ggPrint(p)

For this predictor, we get the following statistics:

dbStatisticsPrint(target, names=(c("KED.T*")), opers=opers,
                  title="Statistics on the Kriging with External Drift predictions",
                  radix="")
## 
## Statistics on the Kriging with External Drift predictions
## ---------------------------------------------------------
##                           Number    Minimum    Maximum       Mean   St. Dev.
## KED.Temperature.estim       3092     -6.004      4.773      1.778      1.540
## KED.Temperature.stdev       3092      0.312      0.615      0.396      0.051
## NULL

Comparing the various kriging predictions

First, we create a correlation plot between the ordinary kriging predictions, and the kriging with external drift (KED) predictions. Note that negative Estimates are present when using External Drift.

p = ggplot()
p = p + plot.correlation(target, "OK.T*estim", "KED.T*estim", flagBiss=TRUE,
                     bins=100)
p = p + plot.decoration(xlab="Ordinary Kriging", ylab="Kriging with External Drift")
ggPrint(p)

We then compare the Mean Squared cross-validation errors obtained in for the different kriging predictions (UK=Universal kriging, OK=Ordinary kriging, COK= Cokriging, KED= Kriging with external drift, KR=Kriging of residuals).

dbStatisticsPrint(dat, names=(c("CV*.Temperature.esterr")), opers=opers,
                  title="Mean-squared cross-validation errors",
                  radix="")
## 
## Mean-squared cross-validation errors
## ------------------------------------
##                               Number    Minimum    Maximum       Mean   St. Dev.
## CV_UK.Temperature.esterr         151     -1.713      1.477     -0.003      0.501
## CV_OK.Temperature.esterr         151     -1.354      1.508     -0.012      0.504
## CV_COK.Temperature.esterr        151     -1.600      1.652     -0.118      0.517
## CV_KED.Temperature.esterr        151     -1.577      1.001     -0.009      0.414
## NULL

We then compare various statistics computed for each predictor.

dbStatisticsPrint(target, names = (c("*.Temperature.estim")), opers=opers,
                  title="Statistics of the predictors",
                  radix="")
## 
## Statistics of the predictors
## ----------------------------
##                                  Number    Minimum    Maximum       Mean   St. Dev.
## UK.Temperature.estim               3092      0.613      5.051      2.841      0.923
## OK.Temperature.estim               3092      0.604      5.083      2.834      0.954
## COK.Temperature.estim              3092      0.202      5.242      2.682      0.979
## ROK.RegRes.Temperature.estim       3092     -0.771      1.586      0.019      0.455
## KR.Temperature.estim               3092     -8.097      5.108      1.445      1.906
## KED.Temperature.estim              3092     -6.004      4.773      1.778      1.540
## NULL

Finally, we compare various statistics computed for the standard-deviation of each predictor.

dbStatisticsPrint(target, names = (c("*.Temperature.stdev")), opers=opers,
                  title="Statistics of the standard-deviation of each predictors",
                  radix="")
## 
## Statistics of the standard-deviation of each predictors
## -------------------------------------------------------
##                                  Number    Minimum    Maximum       Mean   St. Dev.
## UK.Temperature.stdev               3092      0.083      0.919      0.555      0.138
## OK.Temperature.stdev               3092      0.077      0.992      0.492      0.145
## COK.Temperature.stdev              3092      0.231      0.945      0.448      0.109
## ROK.RegRes.Temperature.stdev       3092      0.304      0.504      0.362      0.031
## KED.Temperature.stdev              3092      0.312      0.615      0.396      0.051
## NULL