The statistical model:
\(y_t = \beta_0 + \beta_1 * (Elevation_s)_t + \beta_2 * Slope_t + (b_s)_t + \epsilon_t\)
Where:
Let’s define the parameters:
nstand = 5
nplot = 4
b0 = -1
b1 = .005
b2 = .1
sds = 2
sd = 1
Simulate other variables:
set.seed(16)
stand = rep(LETTERS[1:nstand], each = nplot)
standeff = rep( rnorm(nstand, 0, sds), each = nplot)
ploteff = rnorm(nstand*nplot, 0, sd)
Simulate elevation and slope:
elevation = rep( runif(nstand, 1000, 1500), each = nplot)
slope = runif(nstand*nplot, 2, 75)
Simulate response variable:
resp2 = b0 + b1*elevation + b2*slope + standeff + ploteff
Your tasks (complete each task in its’ own code chunk, make sure to use echo=TRUE so I can see your code):
library(lmerTest)
## Loading required package: lme4
## Loading required package: Matrix
##
## Attaching package: 'lmerTest'
## The following object is masked from 'package:lme4':
##
## lmer
## The following object is masked from 'package:stats':
##
## step
library(lme4)
model1 <- lmer(resp2 ~ 1 + elevation + slope + (1|stand))
summary(model1)
## Linear mixed model fit by REML. t-tests use Satterthwaite's method [
## lmerModLmerTest]
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
##
## REML criterion at convergence: 82
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -1.65583 -0.62467 -0.01693 0.53669 1.41736
##
## Random effects:
## Groups Name Variance Std.Dev.
## stand (Intercept) 1.208 1.099
## Residual 1.358 1.165
## Number of obs: 20, groups: stand, 5
##
## Fixed effects:
## Estimate Std. Error df t value Pr(>|t|)
## (Intercept) -21.314628 6.602050 3.001317 -3.228 0.0482 *
## elevation 0.020600 0.004916 3.113486 4.190 0.0230 *
## slope 0.095105 0.016441 15.868032 5.785 2.88e-05 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## Correlation of Fixed Effects:
## (Intr) elevtn
## elevation -0.991
## slope 0.049 -0.148
model1
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## REML criterion at convergence: 81.9874
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.099
## Residual 1.165
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -21.31463 0.02060 0.09511
simulationfunc <- function(nstand = 5, nplot = 4, b0 = -1, b1 = 0.005, b2 = 0.1, sds = 2, sd = 1) {
stand <- rep(LETTERS[1:nstand], each = nplot)
standeff <- rep(rnorm(nstand, 0, sds), each = nplot)
ploteff <- rnorm(nstand * nplot, 0, sd)
elevation <- rep(runif(nstand, 1000, 1500), each = nplot)
slope <- runif(nstand * nplot, 2, 75)
resp2 <- b0 + b1 * elevation + b2 * slope + standeff + ploteff
dat <- data.frame(resp2, elevation, slope, stand)
lmer(resp2 ~ 1 + elevation + slope + (1|stand), data = dat)
}
simulationfunc()
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.9781
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.3573
## Residual 0.9754
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.584601 -0.005464 0.086839
simulationfunc_result <- replicate(n = 1000, expr = simulationfunc())
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
simulationfunc_result
## [[1]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.7655
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.616
## Residual 1.052
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -15.94625 0.01521 0.12107
##
## [[2]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.7809
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.120
## Residual 1.168
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.92550 0.01556 0.12435
##
## [[3]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.2597
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9093
## Residual 0.9559
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.25232 0.01300 0.09365
##
## [[4]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.7639
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.096
## Residual 1.147
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.92341 0.01345 0.07667
##
## [[5]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 65.105
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.085e-07
## Residual 9.028e-01
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 31.75050 -0.02351 0.12712
## convergence code 0; 1 optimizer warnings; 0 lme4 warnings
##
## [[6]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.6647
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.886
## Residual 1.141
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -29.1899 0.0243 0.1120
##
## [[7]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.2294
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.924
## Residual 1.030
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.114330 0.006126 0.090753
##
## [[8]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.455
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.486
## Residual 1.033
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.808205 0.006743 0.101497
##
## [[9]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.0322
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.435
## Residual 1.045
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.209968 0.008511 0.094803
##
## [[10]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.0446
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8562
## Residual 0.8385
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -15.22549 0.01605 0.12326
##
## [[11]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.9118
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9827
## Residual 1.1241
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.327078 0.009267 0.090123
##
## [[12]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.2029
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0621
## Residual 0.9632
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 29.99805 -0.01767 0.07901
##
## [[13]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.3798
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8417
## Residual 0.8618
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.1597118 0.0005138 0.1117178
##
## [[14]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.1232
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.329
## Residual 1.294
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.588033 -0.003252 0.115496
##
## [[15]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.8434
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.593
## Residual 1.032
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.24684 0.01093 0.08665
##
## [[16]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.123
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.545
## Residual 1.028
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 17.31428 -0.01073 0.10689
##
## [[17]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.9401
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3882
## Residual 0.7274
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.817640 0.008669 0.081058
##
## [[18]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.7865
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8994
## Residual 0.8221
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 16.288285 -0.007951 0.087912
##
## [[19]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.9689
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.850
## Residual 1.217
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.229132 0.003546 0.091198
##
## [[20]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.9735
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.3224
## Residual 0.7773
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.93525 0.00124 0.11632
##
## [[21]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.8661
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.028
## Residual 1.090
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 23.00940 -0.01424 0.11901
##
## [[22]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.4274
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.893
## Residual 1.185
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -26.31397 0.02495 0.10142
##
## [[23]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.7273
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9308
## Residual 0.9998
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.83036 0.01225 0.10667
##
## [[24]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.3987
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.345
## Residual 1.251
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 22.84233 -0.01212 0.09983
##
## [[25]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.8264
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7014
## Residual 0.9414
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -37.5237 0.0382 0.1092
##
## [[26]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.0236
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 4.5929
## Residual 0.8327
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.015052 0.004621 0.087177
##
## [[27]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.6503
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5628
## Residual 1.2869
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.6371686 0.0005823 0.1040315
##
## [[28]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.099
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.009
## Residual 1.079
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.050975 0.006027 0.099017
##
## [[29]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.1177
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.957
## Residual 1.017
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.825071 0.007847 0.110750
##
## [[30]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 68.9358
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0120
## Residual 0.7327
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.667286 0.008747 0.104971
##
## [[31]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 57.3223
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.2259
## Residual 0.6090
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -15.64542 0.01757 0.09131
##
## [[32]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.449
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.461
## Residual 1.015
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.209346 0.001561 0.089595
##
## [[33]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.2909
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8450
## Residual 0.9708
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.891738 0.004751 0.101815
##
## [[34]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.9577
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8602
## Residual 1.0759
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.249318 0.009476 0.096957
##
## [[35]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.7581
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.845
## Residual 1.060
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -14.7256 0.0159 0.1035
##
## [[36]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.0652
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.997
## Residual 1.143
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.0926428 0.0003113 0.0973860
##
## [[37]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.3951
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.556
## Residual 1.043
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.183480 0.007678 0.094213
##
## [[38]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.672
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8338
## Residual 0.8299
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.779284 0.000169 0.102553
##
## [[39]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.7706
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4768
## Residual 0.9254
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.388200 0.007391 0.113491
##
## [[40]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.2176
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.951
## Residual 1.023
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 16.973907 -0.009997 0.097345
##
## [[41]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.5761
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 4.1969
## Residual 0.9887
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.979624 -0.002699 0.100637
##
## [[42]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.1564
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.3697
## Residual 0.9521
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.2864589 -0.0007286 0.1066987
##
## [[43]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.4063
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8883
## Residual 1.0330
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.171912 -0.001455 0.118277
##
## [[44]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.4273
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.805
## Residual 1.132
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.237864 0.007685 0.084825
##
## [[45]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.3883
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7558
## Residual 0.9300
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.782072 0.004305 0.089007
##
## [[46]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.2375
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7657
## Residual 0.8449
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.980812 0.005921 0.109401
##
## [[47]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.1116
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4360
## Residual 0.7465
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.333546 0.003158 0.098196
##
## [[48]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.6783
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.883
## Residual 1.085
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.762607 -0.002037 0.102144
##
## [[49]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.3769
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.386
## Residual 1.045
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -17.46442 0.01834 0.11243
##
## [[50]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.7201
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.216
## Residual 0.769
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.597326 0.008848 0.110265
##
## [[51]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.2561
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.941
## Residual 1.214
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.559054 0.001007 0.117407
##
## [[52]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.8643
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.4167
## Residual 0.9542
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.080762 0.007107 0.109386
##
## [[53]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.5142
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7807
## Residual 1.2062
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.41432 0.01199 0.09821
##
## [[54]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 94.7029
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.932
## Residual 1.564
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 11.60843 -0.00524 0.10084
##
## [[55]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 65.6471
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1562
## Residual 0.5773
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 11.394296 -0.005507 0.100716
##
## [[56]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.7411
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8425
## Residual 0.7945
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.247988 0.007102 0.115740
##
## [[57]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 90.8921
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.904
## Residual 1.363
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.100159 0.004182 0.091318
##
## [[58]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.0819
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.691
## Residual 1.230
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.442949 0.007347 0.088609
##
## [[59]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.0449
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1863
## Residual 0.7261
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 15.833793 -0.007835 0.103525
##
## [[60]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 91.259
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 4.736
## Residual 1.206
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.277144 -0.004614 0.112833
##
## [[61]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.3839
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.651
## Residual 1.034
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -18.80590 0.02150 0.09987
##
## [[62]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 57.5423
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5524
## Residual 0.6120
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 55.46304 -0.04169 0.10804
##
## [[63]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.6342
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7968
## Residual 0.8602
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.249296 -0.002374 0.085495
##
## [[64]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.1752
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8987
## Residual 0.8628
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.150687 0.001669 0.097623
##
## [[65]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.9075
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3464
## Residual 0.8252
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.839648 -0.003924 0.102031
##
## [[66]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.5046
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8680
## Residual 0.7748
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.501867 -0.002282 0.096333
##
## [[67]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.528
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.0241
## Residual 0.6531
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.3647646 -0.0004905 0.0959998
##
## [[68]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.5113
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8747
## Residual 0.7723
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.017335 0.003452 0.080587
##
## [[69]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.2647
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.72
## Residual 1.13
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -23.87697 0.02391 0.09467
##
## [[70]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.1735
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9908
## Residual 0.9536
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.142334 0.005683 0.096087
##
## [[71]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.7385
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9991
## Residual 0.9049
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -23.13150 0.02099 0.10123
##
## [[72]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 68.8679
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.2902
## Residual 0.8415
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.414438 0.006754 0.081350
##
## [[73]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.0948
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.7078
## Residual 0.8632
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -18.22701 0.01828 0.08452
##
## [[74]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.2218
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.2349
## Residual 0.9444
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -47.07839 0.03728 0.09978
##
## [[75]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.6103
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.3223
## Residual 0.9540
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.608131 0.003691 0.087728
##
## [[76]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.7567
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.411
## Residual 1.195
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.58605 0.01131 0.08453
##
## [[77]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.8891
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5035
## Residual 0.9637
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.085370 0.004247 0.113519
##
## [[78]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.98
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5355
## Residual 0.9526
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.890811 0.002092 0.101490
##
## [[79]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.9655
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8767
## Residual 0.8158
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.852711 0.002127 0.080995
##
## [[80]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 66.6844
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.0000
## Residual 0.8157
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -15.05203 0.01490 0.09967
## convergence code 0; 1 optimizer warnings; 0 lme4 warnings
##
## [[81]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.4066
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.641
## Residual 1.076
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.821677 0.008651 0.118087
##
## [[82]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.8899
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.8790
## Residual 0.7449
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.459176 0.004255 0.104853
##
## [[83]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.898
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.759
## Residual 1.012
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.417284 0.003628 0.081090
##
## [[84]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.4058
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6909
## Residual 0.9337
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.595103 0.007523 0.114192
##
## [[85]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.4139
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.680
## Residual 1.293
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.378549 0.004944 0.108867
##
## [[86]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.9229
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.9702
## Residual 0.8815
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.179904 0.005256 0.081222
##
## [[87]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.4667
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.231
## Residual 1.052
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -16.57650 0.01629 0.08369
##
## [[88]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.347
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5264
## Residual 0.9474
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.9059832 0.0007884 0.0963008
##
## [[89]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 90.6311
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.122
## Residual 1.311
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.6895962 0.0003589 0.0927451
##
## [[90]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 92.3089
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.522
## Residual 1.592
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.540060 0.009651 0.094176
##
## [[91]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.9276
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8641
## Residual 0.8387
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.8406501 0.0008225 0.1037024
##
## [[92]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.0983
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.026
## Residual 1.209
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 16.130059 -0.007884 0.071118
##
## [[93]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.9746
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.792
## Residual 1.178
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.57349 0.01455 0.09147
##
## [[94]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.9969
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9635
## Residual 0.9474
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 15.195532 -0.009564 0.125125
##
## [[95]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.7359
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7779
## Residual 0.9911
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.472366 0.007421 0.106089
##
## [[96]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.5738
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 4.729
## Residual 1.041
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.999748 0.003467 0.096339
##
## [[97]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.93
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1569
## Residual 0.9919
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.468630 -0.003546 0.098669
##
## [[98]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.0064
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.894
## Residual 1.415
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.580894 -0.004241 0.084776
##
## [[99]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 68.5597
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8520
## Residual 0.7351
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.699393 0.003146 0.079251
##
## [[100]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 64.8551
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4159
## Residual 0.5963
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.28596 0.01251 0.10660
##
## [[101]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.6281
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.553
## Residual 1.129
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 11.074446 -0.004658 0.122356
##
## [[102]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.388
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8996
## Residual 0.9578
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -15.24723 0.01515 0.10423
##
## [[103]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.8797
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3094
## Residual 0.9084
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 11.371483 -0.003697 0.091654
##
## [[104]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.0474
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8229
## Residual 0.6546
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.80654 -0.00183 0.10302
##
## [[105]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.1437
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.050
## Residual 1.267
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.46676 0.01261 0.08580
##
## [[106]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.2156
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.549
## Residual 1.083
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.76941 0.01542 0.11071
##
## [[107]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.298
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.7120
## Residual 0.7922
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.90554 0.01392 0.10517
##
## [[108]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.4862
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5816
## Residual 0.9758
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.26034 0.01093 0.10032
##
## [[109]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.9957
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.191
## Residual 1.046
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.043964 0.009839 0.102355
##
## [[110]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.6549
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.186
## Residual 1.478
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.19371 0.01061 0.09781
##
## [[111]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.5423
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5687
## Residual 1.0354
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.073892 0.003981 0.088011
##
## [[112]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.6886
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8038
## Residual 1.0342
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.97767 0.01277 0.10282
##
## [[113]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.0748
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.531
## Residual 1.112
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.540473 -0.002418 0.109583
##
## [[114]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.7973
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8661
## Residual 1.0112
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.5265686 0.0004225 0.1014147
##
## [[115]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.8557
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.840
## Residual 1.068
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.963016 0.006142 0.102781
##
## [[116]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.5713
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.2933
## Residual 1.0581
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.423781 0.004111 0.072567
##
## [[117]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.2714
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4970
## Residual 0.8274
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.364092 0.004655 0.120385
##
## [[118]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.7959
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9926
## Residual 0.9394
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.651889 0.008873 0.081945
##
## [[119]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.2455
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.530
## Residual 1.058
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.701329 0.008922 0.122894
##
## [[120]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.7849
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.714
## Residual 1.172
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.384229 -0.004248 0.109299
##
## [[121]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.459
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.540
## Residual 1.028
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.47938 0.01173 0.09058
##
## [[122]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.3601
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0425
## Residual 0.8513
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.921789 0.006268 0.097059
##
## [[123]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.4103
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2126
## Residual 0.8653
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.773011 0.008466 0.118129
##
## [[124]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.9582
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.4164
## Residual 0.8972
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.422123 0.009811 0.094962
##
## [[125]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 91.4101
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.266
## Residual 1.313
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.569235 0.009397 0.090002
##
## [[126]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.1915
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.022
## Residual 1.003
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.03684 0.01123 0.09116
##
## [[127]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.3905
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9248
## Residual 0.8582
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.483385 0.002328 0.088745
##
## [[128]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.3488
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0372
## Residual 0.8969
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.694312 -0.001565 0.094624
##
## [[129]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.5562
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1244
## Residual 0.9174
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -17.16010 0.01730 0.08692
##
## [[130]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.4279
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.1185
## Residual 0.9253
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.872034 -0.000834 0.113656
##
## [[131]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.3566
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5773
## Residual 0.7343
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.040378 0.006672 0.103738
##
## [[132]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.7979
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.387
## Residual 1.054
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -51.59342 0.04091 0.08579
##
## [[133]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.6977
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.462
## Residual 1.106
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.757619 0.002688 0.110957
##
## [[134]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.568
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.000
## Residual 1.042
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.7833060 0.0006712 0.0736942
##
## [[135]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.762
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.243
## Residual 1.046
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -26.44927 0.02737 0.10930
##
## [[136]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.2809
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5280
## Residual 0.8707
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.43198 0.01429 0.11511
##
## [[137]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.3522
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.223
## Residual 1.206
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.689820 0.006318 0.112560
##
## [[138]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.0068
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4720
## Residual 0.8081
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.75076 0.01493 0.11353
##
## [[139]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.5362
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2368
## Residual 0.9258
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.120705 0.004695 0.105040
##
## [[140]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.718
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6145
## Residual 0.8774
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.50829 0.00651 0.09315
##
## [[141]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.3343
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7662
## Residual 0.8915
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.919103 0.001698 0.102331
##
## [[142]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.2279
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.144
## Residual 1.340
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -14.26370 0.01516 0.09281
##
## [[143]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.357
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.158
## Residual 1.271
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.04127 0.01185 0.09375
##
## [[144]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.1406
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.972
## Residual 1.151
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.935269 0.001588 0.092647
##
## [[145]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.1239
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8110
## Residual 0.9345
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.480869 0.009992 0.073047
##
## [[146]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.7461
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.301
## Residual 1.090
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.567305 0.006422 0.108803
##
## [[147]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.3405
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.3323
## Residual 0.7984
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.288678 0.005468 0.091499
##
## [[148]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.7109
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4123
## Residual 0.9957
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.99854 0.01465 0.10056
##
## [[149]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.5656
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.991
## Residual 1.132
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.390854 0.005886 0.106444
##
## [[150]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.5567
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6699
## Residual 0.8745
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.051988 0.006473 0.081615
##
## [[151]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.5243
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2209
## Residual 0.9107
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.610895 0.004501 0.081254
##
## [[152]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.0947
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.899
## Residual 0.921
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.8937740 0.0004011 0.0983974
##
## [[153]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.3674
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6664
## Residual 0.9767
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -14.87494 0.01721 0.08462
##
## [[154]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.4039
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6434
## Residual 0.8484
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.398196 -0.001728 0.096653
##
## [[155]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.833
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.079
## Residual 1.274
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.486270 0.003895 0.102678
##
## [[156]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.9337
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8874
## Residual 0.9442
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.138277 0.004096 0.097648
##
## [[157]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.8393
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.00997
## Residual 1.00511
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.505419 0.001506 0.108862
##
## [[158]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.5195
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3427
## Residual 0.7982
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.9030445 0.0006595 0.0904111
##
## [[159]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.7967
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.079
## Residual 1.070
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.73218 0.01067 0.08353
##
## [[160]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.8621
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6931
## Residual 0.9512
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.30026 0.01493 0.09973
##
## [[161]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.2388
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.9110
## Residual 0.9185
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -14.34714 0.01541 0.11123
##
## [[162]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.5926
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.725
## Residual 1.393
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.120925 -0.002594 0.090781
##
## [[163]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 58.6125
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6553
## Residual 0.4795
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.071860 0.009324 0.076582
##
## [[164]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.8733
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.732
## Residual 0.861
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.60389 0.01168 0.09027
##
## [[165]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.8088
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9193
## Residual 0.8038
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.2251488 0.0003486 0.0952703
##
## [[166]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.229
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3384
## Residual 0.9964
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.01089 0.01053 0.10068
##
## [[167]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.3
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.632
## Residual 1.225
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.46750 0.01128 0.07890
##
## [[168]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.5973
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9210
## Residual 0.8162
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.826628 0.009102 0.062552
##
## [[169]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 90.0898
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.738
## Residual 1.279
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 11.397944 -0.004416 0.086668
##
## [[170]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.2823
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.3835
## Residual 1.0043
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.286709 -0.002288 0.122527
##
## [[171]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.2175
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.126
## Residual 1.133
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 14.999109 -0.006645 0.086789
##
## [[172]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.5772
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5476
## Residual 0.9224
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.071171 0.003129 0.091410
##
## [[173]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.7619
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4104
## Residual 0.8201
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.79327 -0.00318 0.07606
##
## [[174]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.3293
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.791
## Residual 1.170
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -14.55289 0.01554 0.08427
##
## [[175]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.1572
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8347
## Residual 0.8865
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.062550 0.004267 0.089115
##
## [[176]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.534
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8593
## Residual 0.7619
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 19.71478 -0.01119 0.10927
##
## [[177]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.4885
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.390
## Residual 0.779
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.437135 0.006535 0.101773
##
## [[178]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.4005
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.630
## Residual 1.254
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.99344 0.01001 0.10097
##
## [[179]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 66.263
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0463
## Residual 0.5729
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.2218 0.0146 0.1000
##
## [[180]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.1384
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.936
## Residual 1.099
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.663119 0.008326 0.129033
##
## [[181]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.2229
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.379
## Residual 1.148
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.125974 -0.005246 0.098150
##
## [[182]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.052
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.4012
## Residual 1.5786
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 16.556345 -0.009033 0.086277
##
## [[183]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.8814
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.423
## Residual 1.147
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.176729 0.009415 0.122710
##
## [[184]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.2838
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2485
## Residual 0.8515
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.337612 0.001908 0.109187
##
## [[185]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.4776
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9870
## Residual 0.9751
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.538173 -0.003406 0.107913
##
## [[186]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.2203
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.286
## Residual 1.064
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.46990 -0.00548 0.11465
##
## [[187]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.2409
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0666
## Residual 0.6758
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.3546 0.0109 0.1115
##
## [[188]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.7051
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6428
## Residual 0.8946
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.730090 0.002114 0.110922
##
## [[189]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.5743
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.773
## Residual 1.122
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.677243 0.002922 0.106426
##
## [[190]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.0902
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3005
## Residual 0.8258
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.720344 0.003294 0.077113
##
## [[191]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.6232
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.4551
## Residual 0.8927
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 11.576003 -0.003735 0.083147
##
## [[192]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.593
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.464
## Residual 1.203
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.437077 0.007796 0.090765
##
## [[193]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.357
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7895
## Residual 1.0727
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 16.89855 -0.01007 0.11472
##
## [[194]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.8992
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4968
## Residual 0.8123
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.1551523 0.0007513 0.1071523
##
## [[195]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.261
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9607
## Residual 1.0160
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.4727050 0.0005574 0.0969229
##
## [[196]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.7379
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3391
## Residual 0.7867
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.186650 0.005195 0.097815
##
## [[197]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 92.3759
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.859
## Residual 1.495
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.522517 0.008717 0.101514
##
## [[198]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.7255
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.3487
## Residual 0.9428
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 19.097360 -0.009386 0.080320
##
## [[199]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.2657
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4054
## Residual 0.9101
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.383426 0.005374 0.101770
##
## [[200]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.5602
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.493
## Residual 0.683
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -15.21937 0.01662 0.10379
##
## [[201]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.3458
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1232
## Residual 0.8224
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.057761 0.004511 0.100831
##
## [[202]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.0772
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2935
## Residual 0.9728
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.48748 0.01058 0.11078
##
## [[203]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.7522
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.060
## Residual 1.022
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.013147 0.009907 0.090285
##
## [[204]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.0548
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.648
## Residual 1.155
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.654177 0.005902 0.112824
##
## [[205]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.8614
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.197
## Residual 1.353
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.971771 0.007454 0.111623
##
## [[206]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.741
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1171
## Residual 0.9459
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 15.467381 -0.009878 0.110262
##
## [[207]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.9783
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.988
## Residual 0.948
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 16.377917 -0.008126 0.106286
##
## [[208]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.4845
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.3126
## Residual 0.9644
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.79296 0.01234 0.10689
##
## [[209]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.5292
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.995
## Residual 1.002
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.74665 0.00127 0.09077
##
## [[210]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 60.0992
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8198
## Residual 0.5735
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 16.153541 -0.007829 0.092007
##
## [[211]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.5816
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1909
## Residual 0.7938
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.6341687 0.0004041 0.0773732
##
## [[212]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.3947
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.891
## Residual 1.120
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.386065 0.001404 0.089002
##
## [[213]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.2919
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1103
## Residual 0.8019
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.08610 0.01162 0.12575
##
## [[214]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.3938
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.901
## Residual 1.023
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 17.135400 -0.009798 0.099371
##
## [[215]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.2177
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9830
## Residual 0.8864
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 27.89207 -0.01895 0.10550
##
## [[216]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.1742
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9333
## Residual 0.8269
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.98618 0.01325 0.09764
##
## [[217]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.8871
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.243
## Residual 1.001
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.0693164 0.0002353 0.0889600
##
## [[218]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.5779
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.723
## Residual 0.888
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.079551 0.006083 0.086565
##
## [[219]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 65.9026
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.047e-08
## Residual 8.239e-01
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.090075 0.008529 0.075582
## convergence code 0; 1 optimizer warnings; 0 lme4 warnings
##
## [[220]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.8034
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.868
## Residual 1.014
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.3051 0.0020 0.1104
##
## [[221]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.064
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.477
## Residual 1.006
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -18.87007 0.01765 0.11380
##
## [[222]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.3647
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9036
## Residual 0.8544
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.582124 0.005275 0.111735
##
## [[223]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.9962
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 4.0754
## Residual 0.9529
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.5400079 -0.0001995 0.1068872
##
## [[224]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.7863
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.3989
## Residual 0.9147
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.923665 0.007354 0.104050
##
## [[225]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.9398
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.486
## Residual 1.166
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.81517 0.01604 0.09555
##
## [[226]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.3039
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.093
## Residual 1.043
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.672316 0.004005 0.105209
##
## [[227]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.2222
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4462
## Residual 0.7741
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.32294 0.01000 0.08206
##
## [[228]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.0404
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8272
## Residual 0.9469
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -15.67217 0.01646 0.09819
##
## [[229]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.5126
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.1310
## Residual 0.7513
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.06309 0.01292 0.08806
##
## [[230]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.062
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9383
## Residual 0.8307
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.300082 0.002567 0.108401
##
## [[231]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.0489
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8953
## Residual 0.9521
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.7333865 -0.0003411 0.1206404
##
## [[232]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.4009
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9570
## Residual 0.7749
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.68798 0.01040 0.09366
##
## [[233]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 68.2347
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5968
## Residual 0.6687
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.83801 0.01493 0.10982
##
## [[234]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.8245
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.476
## Residual 1.034
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.220694 0.004695 0.091980
##
## [[235]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.5372
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2897
## Residual 0.8905
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.634865 0.003106 0.108405
##
## [[236]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.6587
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.033
## Residual 1.092
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.435699 0.007015 0.089714
##
## [[237]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.715
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.592
## Residual 1.249
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.257987 0.002769 0.101932
##
## [[238]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.901
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.979
## Residual 1.146
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 13.088968 -0.006576 0.092965
##
## [[239]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.215
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3400
## Residual 0.9673
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.991804 0.005421 0.108260
##
## [[240]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.9706
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.725
## Residual 1.118
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.4328 0.0103 0.1073
##
## [[241]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.4579
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.144
## Residual 0.865
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -17.51686 0.01892 0.10517
##
## [[242]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.8936
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.101
## Residual 0.735
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.85990 0.01164 0.09741
##
## [[243]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.7375
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.059
## Residual 0.969
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.919969 0.001841 0.090541
##
## [[244]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 67.6202
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6762
## Residual 0.7782
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.583107 0.008343 0.094555
##
## [[245]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.697
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.1238
## Residual 0.8659
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.970991 0.007813 0.106283
##
## [[246]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.0587
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.000
## Residual 1.231
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.66378 0.00477 0.11413
## convergence code 0; 1 optimizer warnings; 0 lme4 warnings
##
## [[247]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.7095
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8342
## Residual 0.9334
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.71850 0.00256 0.11381
##
## [[248]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.0498
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7766
## Residual 0.9988
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.396824 0.004338 0.113235
##
## [[249]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.6686
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9262
## Residual 0.8589
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.26098 0.01219 0.11746
##
## [[250]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 90.1978
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.190
## Residual 1.365
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.55947 0.01363 0.10380
##
## [[251]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 66.0537
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4279
## Residual 0.5719
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -22.18470 0.02302 0.10334
##
## [[252]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.7959
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.4492
## Residual 0.9169
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.711743 0.005794 0.087591
##
## [[253]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.7478
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.724
## Residual 1.135
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.5063126 -0.0001846 0.1101952
##
## [[254]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.632
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.885
## Residual 1.137
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 17.327857 -0.009634 0.084006
##
## [[255]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.125
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9632
## Residual 1.1933
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.283239 0.005115 0.086457
##
## [[256]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.2384
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0571
## Residual 0.6888
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.41849 0.01056 0.09282
##
## [[257]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.0348
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2598
## Residual 0.9138
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.515519 0.001726 0.099573
##
## [[258]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.8689
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.7462
## Residual 0.8497
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.578292 0.005581 0.082993
##
## [[259]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.8405
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.0919
## Residual 0.9421
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.795109 0.007973 0.090493
##
## [[260]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.3475
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6876
## Residual 1.3226
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 17.72058 -0.01029 0.10870
##
## [[261]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.6651
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.7018
## Residual 0.7864
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.891281 0.004297 0.091241
##
## [[262]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.0024
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.3699
## Residual 0.9664
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.002398 -0.001585 0.096667
##
## [[263]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.693
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8473
## Residual 0.9573
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.564697 0.009932 0.113235
##
## [[264]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.4895
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.304
## Residual 1.210
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.026607 -0.000975 0.094560
##
## [[265]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.1574
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.365
## Residual 1.073
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.104975 0.004572 0.111049
##
## [[266]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.8531
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.220
## Residual 1.075
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.760863 0.003418 0.101480
##
## [[267]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.5923
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0415
## Residual 0.9518
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.07888 0.01245 0.08949
##
## [[268]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.2373
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.127
## Residual 0.738
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.614126 -0.003554 0.107159
##
## [[269]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.208
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.1073
## Residual 0.8059
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 15.974116 -0.006409 0.106714
##
## [[270]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 68.8836
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8818
## Residual 0.6612
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.450887 -0.004629 0.104939
##
## [[271]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.9282
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.009
## Residual 1.324
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.407779 0.004773 0.113317
##
## [[272]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.1053
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1844
## Residual 0.8777
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.819122 0.007354 0.079744
##
## [[273]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.1044
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7825
## Residual 0.8296
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.3355602 0.0004386 0.1123302
##
## [[274]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.4703
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.466
## Residual 1.021
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -32.75652 0.03097 0.08237
##
## [[275]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.6321
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.9096
## Residual 0.8813
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.68145 0.01267 0.12879
##
## [[276]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.9869
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.1771
## Residual 0.7883
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 13.646100 -0.005508 0.111812
##
## [[277]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.4832
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7014
## Residual 0.9776
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.237287 -0.001205 0.071302
##
## [[278]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.9572
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6770
## Residual 0.8786
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.875514 0.001902 0.099374
##
## [[279]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.3055
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.726
## Residual 1.119
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.3531031 -0.0006967 0.1024759
##
## [[280]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.1258
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.325
## Residual 1.233
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.25214 0.01176 0.09264
##
## [[281]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.1515
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.482
## Residual 0.912
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.2062637 -0.0008838 0.0659352
##
## [[282]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 68.9746
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.5109
## Residual 0.6092
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.886637 -0.004884 0.099647
##
## [[283]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.6028
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.323
## Residual 1.006
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.053802 -0.001819 0.077711
##
## [[284]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.8567
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.066
## Residual 1.034
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.458046 0.007109 0.091664
##
## [[285]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.9109
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.406
## Residual 1.202
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.98981 0.01228 0.10226
##
## [[286]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.8543
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.47
## Residual 1.05
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.577458 0.003475 0.093620
##
## [[287]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.0627
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.4746
## Residual 0.8411
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.173631 0.009613 0.104520
##
## [[288]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.6037
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1096
## Residual 0.8105
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.285858 0.007893 0.103105
##
## [[289]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.6002
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8814
## Residual 1.2699
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.503844 0.004055 0.132901
##
## [[290]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.981
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.6257
## Residual 0.7174
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 16.165516 -0.008611 0.101066
##
## [[291]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.0715
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.663
## Residual 0.902
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 11.508872 -0.003438 0.097119
##
## [[292]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.2148
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8767
## Residual 0.9557
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.665920 0.001114 0.103621
##
## [[293]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.6749
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.030
## Residual 1.119
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.136774 0.009317 0.117526
##
## [[294]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.8551
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.2631
## Residual 0.9936
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.5582027 -0.0005663 0.0790879
##
## [[295]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.1326
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6231
## Residual 0.9999
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.1469623 -0.0005115 0.0881572
##
## [[296]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.8741
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2870
## Residual 0.7288
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.048578 -0.001189 0.102323
##
## [[297]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.694
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.915
## Residual 1.033
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.627312 0.008457 0.110010
##
## [[298]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.5622
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6855
## Residual 0.9146
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.580394 0.009806 0.109409
##
## [[299]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.596
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1176
## Residual 0.9364
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.9098 -0.0004 0.1176
##
## [[300]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.2248
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.356
## Residual 0.995
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -15.45316 0.01648 0.10509
##
## [[301]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.7457
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6186
## Residual 0.8779
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.805307 0.001707 0.100294
##
## [[302]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.9687
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4018
## Residual 0.9391
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.5114660 -0.0004279 0.0840415
##
## [[303]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.6458
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7644
## Residual 0.8772
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.454999 -0.003133 0.099701
##
## [[304]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.6731
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.773
## Residual 1.252
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -20.29139 0.02146 0.11159
##
## [[305]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.6584
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0041
## Residual 0.8573
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.871676 -0.002175 0.075174
##
## [[306]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.4649
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3749
## Residual 0.9606
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.263451 0.006785 0.103025
##
## [[307]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.5342
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9278
## Residual 0.8378
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.87855 0.01609 0.09927
##
## [[308]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.5666
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6481
## Residual 1.1030
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 13.00097 -0.00661 0.09480
##
## [[309]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.5866
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.655
## Residual 1.214
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.139676 0.008817 0.117445
##
## [[310]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.1515
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.729
## Residual 1.143
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.519642 0.002822 0.097054
##
## [[311]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.8028
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2810
## Residual 0.9637
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.856540 0.002371 0.099599
##
## [[312]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.4405
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6071
## Residual 0.8928
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.81790 0.01240 0.09317
##
## [[313]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.8782
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.923
## Residual 1.027
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.38407 0.01436 0.09920
##
## [[314]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 90.5602
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.295
## Residual 1.393
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 19.766174 -0.009762 0.090509
##
## [[315]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.4322
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8902
## Residual 1.1160
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.64449 -0.00336 0.09721
##
## [[316]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.6569
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.166
## Residual 1.129
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.158377 -0.003779 0.074957
##
## [[317]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.7977
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.294
## Residual 1.188
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -18.99818 0.01953 0.10684
##
## [[318]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.1484
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.621
## Residual 1.270
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.56855 0.01136 0.09012
##
## [[319]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.5575
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.095
## Residual 1.192
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.434879 -0.002157 0.107129
##
## [[320]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.292
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.559
## Residual 1.095
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.410392 0.003153 0.110458
##
## [[321]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.5913
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9575
## Residual 0.9713
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.120406 0.006973 0.114961
##
## [[322]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.8799
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.790
## Residual 1.125
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 18.196005 -0.008559 0.099886
##
## [[323]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.508
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7293
## Residual 1.3346
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.928567 0.004261 0.112044
##
## [[324]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.4131
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8255
## Residual 0.8495
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.6708157 -0.0009503 0.1175178
##
## [[325]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.0926
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.797
## Residual 1.199
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.0639807 0.0005786 0.1110874
##
## [[326]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.0445
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.322
## Residual 1.145
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.56027 0.01487 0.09113
##
## [[327]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.7539
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.885
## Residual 1.196
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.115969 0.001931 0.093240
##
## [[328]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.6721
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6364
## Residual 1.2325
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.955358 0.009866 0.098035
##
## [[329]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.8435
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1885
## Residual 0.8331
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.480362 0.005196 0.083861
##
## [[330]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 66.762
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.3754
## Residual 0.7977
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.757493 0.003848 0.096101
##
## [[331]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.9351
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.928
## Residual 1.058
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.150332 0.002653 0.084953
##
## [[332]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.9518
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9201
## Residual 0.9750
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.989500 0.002353 0.114095
##
## [[333]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.5385
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.54
## Residual 1.04
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.032508 -0.002521 0.101988
##
## [[334]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.6385
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.355
## Residual 1.179
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 22.62963 -0.01253 0.09396
##
## [[335]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.4277
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1686
## Residual 0.7615
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.825700 0.007989 0.106396
##
## [[336]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.424
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.114
## Residual 1.152
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.78731 0.01241 0.10886
##
## [[337]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.6494
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.429
## Residual 1.088
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.08152 0.01431 0.10658
##
## [[338]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.3887
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.075
## Residual 1.111
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.139745 0.001474 0.087799
##
## [[339]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.9155
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1231
## Residual 0.9988
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.541348 0.009897 0.086177
##
## [[340]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.8173
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.407
## Residual 1.166
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.719305 0.004144 0.094420
##
## [[341]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.5902
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.242
## Residual 1.334
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -14.52776 0.01644 0.10720
##
## [[342]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.414
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.9731
## Residual 0.8403
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.664664 0.004536 0.102012
##
## [[343]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.7704
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.781
## Residual 1.092
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.039e+00 -4.792e-05 9.882e-02
##
## [[344]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.0692
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9909
## Residual 0.7363
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.079705 0.002228 0.100541
##
## [[345]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.4877
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3651
## Residual 0.8526
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.3717078 0.0006744 0.0899036
##
## [[346]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.038
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.201
## Residual 1.252
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.94711 0.01345 0.09765
##
## [[347]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.3024
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 4.115
## Residual 1.106
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.473015 0.009828 0.118867
##
## [[348]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.9349
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2181
## Residual 0.9631
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.867445 0.008156 0.105827
##
## [[349]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.0022
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9758
## Residual 0.8492
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.59429 0.01174 0.10562
##
## [[350]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.5658
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.939
## Residual 1.019
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.35966 0.01011 0.09749
##
## [[351]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.85
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7633
## Residual 1.1662
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.580585 0.008721 0.109314
##
## [[352]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 66.1472
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9808
## Residual 0.6854
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.379087 0.006781 0.109146
##
## [[353]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.5697
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.000
## Residual 1.108
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 24.13331 -0.01452 0.10027
## convergence code 0; 1 optimizer warnings; 0 lme4 warnings
##
## [[354]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.1059
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.610
## Residual 0.744
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.823477 0.007415 0.088400
##
## [[355]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.9033
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.567
## Residual 1.191
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -16.1040 0.0184 0.1058
##
## [[356]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.3777
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.823
## Residual 1.229
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.96576 0.00517 0.12086
##
## [[357]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.1936
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.302
## Residual 1.087
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.885149 0.004693 0.107582
##
## [[358]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.3583
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.794
## Residual 1.042
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -14.50976 0.01605 0.09342
##
## [[359]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.105
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.453
## Residual 0.907
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.059504 0.009518 0.118907
##
## [[360]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.1437
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6939
## Residual 0.8757
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.329828 0.003151 0.087543
##
## [[361]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.9253
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.224
## Residual 1.015
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.8676640 0.0004876 0.1133535
##
## [[362]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.5672
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.655
## Residual 1.013
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.122760 0.001051 0.102284
##
## [[363]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.3962
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.278
## Residual 1.116
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.604998 0.003738 0.087295
##
## [[364]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.7371
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8699
## Residual 0.8765
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.231396 0.009535 0.092560
##
## [[365]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.6962
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.258
## Residual 1.109
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -29.56670 0.03146 0.09094
##
## [[366]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.4242
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.049
## Residual 1.121
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.749894 0.004901 0.120619
##
## [[367]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.2611
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.3238
## Residual 0.9865
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.66842 0.01254 0.09264
##
## [[368]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.5239
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.710
## Residual 1.123
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.769377 0.003581 0.113014
##
## [[369]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.4683
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.194
## Residual 1.024
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -29.31538 0.02927 0.11912
##
## [[370]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 68.5987
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8953
## Residual 0.7461
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.332716 0.006658 0.107286
##
## [[371]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.5602
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.452
## Residual 1.186
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.351467 0.004145 0.102150
##
## [[372]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.0039
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.077
## Residual 1.152
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -18.22904 0.01798 0.10345
##
## [[373]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.9192
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.7909
## Residual 0.9501
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.3654608 0.0002163 0.0849580
##
## [[374]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 92.0872
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.435
## Residual 1.329
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.883916 -0.002136 0.086700
##
## [[375]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.333
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.228
## Residual 1.010
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.105158 0.007043 0.111192
##
## [[376]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 65.5499
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.155e-07
## Residual 8.062e-01
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 12.839599 -0.004835 0.095192
## convergence code 0; 1 optimizer warnings; 0 lme4 warnings
##
## [[377]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.5805
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.851
## Residual 0.840
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.816707 -0.002096 0.104639
##
## [[378]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.0298
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.733
## Residual 0.908
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.18995 0.00798 0.12386
##
## [[379]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 90.9157
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.023
## Residual 1.384
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.64265 0.01045 0.13512
##
## [[380]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 90.2589
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.551
## Residual 1.193
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.464463 0.001757 0.105691
##
## [[381]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.7955
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1623
## Residual 0.9759
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.69964 0.01211 0.11315
##
## [[382]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.7003
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.3535
## Residual 0.9621
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.296376 0.009138 0.096810
##
## [[383]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.9591
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.867
## Residual 1.274
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.35879 -0.00225 0.11482
##
## [[384]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.361
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8600
## Residual 0.8057
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.792317 0.007613 0.107598
##
## [[385]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.0972
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.720
## Residual 1.073
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.683047 0.009157 0.085931
##
## [[386]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.8973
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.00
## Residual 1.03
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.78473 0.01559 0.07690
## convergence code 0; 1 optimizer warnings; 0 lme4 warnings
##
## [[387]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.4339
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7576
## Residual 0.7041
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.075137 0.009951 0.117949
##
## [[388]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.0836
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8919
## Residual 1.0182
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.49640 0.01314 0.09622
##
## [[389]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.9651
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.623
## Residual 0.905
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.756733 -0.001471 0.114656
##
## [[390]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.3541
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0056
## Residual 0.8863
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.774328 -0.003798 0.106257
##
## [[391]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.3911
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6114
## Residual 0.7688
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.169667 0.004232 0.101715
##
## [[392]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.7731
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7246
## Residual 0.8411
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.358725 0.001924 0.114616
##
## [[393]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 92.332
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.70
## Residual 1.51
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.111443 0.007281 0.066333
##
## [[394]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.1865
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.184
## Residual 1.007
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.757498 -0.003467 0.128666
##
## [[395]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.9172
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0325
## Residual 0.9516
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.610863 0.009672 0.092028
##
## [[396]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.1726
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1423
## Residual 0.9636
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.880824 0.007606 0.087226
##
## [[397]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.6471
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9415
## Residual 1.0110
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.89163 -0.00409 0.09770
##
## [[398]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.6351
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.4278
## Residual 1.0205
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.533174 -0.000577 0.089359
##
## [[399]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.7922
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.563
## Residual 1.064
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.580827 0.006926 0.091824
##
## [[400]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.3338
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8409
## Residual 0.9674
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.647242 0.005493 0.100416
##
## [[401]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.2069
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.924
## Residual 1.170
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.248393 0.004419 0.077137
##
## [[402]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.0782
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9596
## Residual 0.7539
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.306858 0.006269 0.080135
##
## [[403]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.3855
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.2862
## Residual 0.9914
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.25965 0.00816 0.11363
##
## [[404]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.7875
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5741
## Residual 1.0461
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.4215389 -0.0006378 0.0975480
##
## [[405]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.1572
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.1933
## Residual 0.8429
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.033128 0.002079 0.082648
##
## [[406]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.8851
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5927
## Residual 1.3502
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.80622 0.01093 0.11926
##
## [[407]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 68.811
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2324
## Residual 0.7045
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.35949 0.01104 0.09169
##
## [[408]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.3233
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.903
## Residual 1.108
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.957507 0.001543 0.108427
##
## [[409]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.0567
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1226
## Residual 0.8557
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 26.77160 -0.01862 0.09232
##
## [[410]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.1609
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.2048
## Residual 0.9447
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.731939 0.005851 0.117504
##
## [[411]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.8417
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.248
## Residual 0.747
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.712835 0.005639 0.075585
##
## [[412]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.1648
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8122
## Residual 0.6368
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.90709 0.01179 0.08703
##
## [[413]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.0852
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.680
## Residual 1.247
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.821077 0.002181 0.082919
##
## [[414]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.956
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6661
## Residual 0.9005
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.344735 -0.005122 0.102249
##
## [[415]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.3368
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.046
## Residual 1.077
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.542538 0.007375 0.100319
##
## [[416]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 55.7073
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2980
## Residual 0.4278
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.83907 0.01249 0.10197
##
## [[417]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.3743
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.718
## Residual 1.018
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.637355 -0.003241 0.098993
##
## [[418]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 66.998
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8785
## Residual 0.7498
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 17.236585 -0.007479 0.087605
##
## [[419]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.5253
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.534
## Residual 1.627
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.01255 0.00864 0.09793
##
## [[420]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.3019
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.000
## Residual 1.279
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.55643 0.01473 0.10144
##
## [[421]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 90.2219
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.044
## Residual 1.284
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.928170 0.007031 0.079591
##
## [[422]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.2625
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.4401
## Residual 0.8401
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.99853 0.01279 0.09750
##
## [[423]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.2761
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.935
## Residual 0.902
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 11.098663 -0.005107 0.078183
##
## [[424]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.7368
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.323
## Residual 1.218
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.20797 0.01215 0.08811
##
## [[425]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 68.9798
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2802
## Residual 0.7232
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 16.953318 -0.009812 0.106697
##
## [[426]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.6358
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0632
## Residual 0.9958
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.147572 -0.002371 0.110528
##
## [[427]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.7545
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.664
## Residual 0.975
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.60616 0.01013 0.09822
##
## [[428]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 91.1038
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.757
## Residual 1.426
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 11.575134 -0.005563 0.105535
##
## [[429]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.8986
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2512
## Residual 0.9831
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.796629 0.009422 0.092607
##
## [[430]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.6684
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8182
## Residual 1.0801
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.271708 0.001486 0.095114
##
## [[431]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.8428
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.095
## Residual 1.070
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.889124 0.001737 0.071391
##
## [[432]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.8749
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.9512
## Residual 0.9766
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 16.607392 -0.008299 0.107999
##
## [[433]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.1202
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.527
## Residual 1.049
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.13016 0.01116 0.11252
##
## [[434]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.2399
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.288
## Residual 1.154
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.77287 0.01071 0.11414
##
## [[435]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.006
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9400
## Residual 0.8859
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.83697 0.00282 0.09625
##
## [[436]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.3364
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.2643
## Residual 0.9536
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.217197 0.001656 0.086585
##
## [[437]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.6527
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.810
## Residual 1.095
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.415000 0.007014 0.111397
##
## [[438]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.6541
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5346
## Residual 0.9848
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.361063 0.005315 0.104455
##
## [[439]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.5524
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.013
## Residual 1.141
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 25.82706 -0.01845 0.10683
##
## [[440]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.2504
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7664
## Residual 0.8363
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.721521 -0.004089 0.096932
##
## [[441]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.2457
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.231
## Residual 1.104
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.543783 0.003745 0.111459
##
## [[442]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.6319
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4097
## Residual 0.9783
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 17.348871 -0.009024 0.100205
##
## [[443]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.592
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0780
## Residual 0.9867
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -17.01452 0.01789 0.10734
##
## [[444]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 91.4934
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.320
## Residual 1.322
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.620553 0.006662 0.094191
##
## [[445]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.907
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8407
## Residual 0.9325
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.6783392 -0.0002745 0.1070385
##
## [[446]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.7745
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.0587
## Residual 0.8938
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.16372 0.01205 0.10533
##
## [[447]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.2524
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.546
## Residual 0.935
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.5873669 -0.0009746 0.1026495
##
## [[448]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.6362
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1388
## Residual 0.9316
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 12.629208 -0.007235 0.113339
##
## [[449]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.5916
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.789
## Residual 1.030
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.674523 0.008114 0.104913
##
## [[450]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.6124
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.3574
## Residual 0.9768
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.69303 0.01711 0.08724
##
## [[451]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.1497
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8619
## Residual 0.8459
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.769740 0.001888 0.081286
##
## [[452]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.5216
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8019
## Residual 0.8312
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -17.03902 0.01846 0.11666
##
## [[453]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.3839
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0225
## Residual 0.9936
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -32.50945 0.03318 0.09688
##
## [[454]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.2423
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.310
## Residual 1.243
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.9964873 0.0000535 0.0923623
##
## [[455]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.4792
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8621
## Residual 0.7775
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.695799 -0.001017 0.124448
##
## [[456]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.7862
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.892
## Residual 1.050
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.225024 0.009134 0.099400
##
## [[457]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.2066
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4876
## Residual 0.9411
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.25769 0.01019 0.09994
##
## [[458]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.1996
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.406
## Residual 1.128
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.286559 -0.001293 0.110140
##
## [[459]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 66.7824
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6360
## Residual 0.6567
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.725017 0.007882 0.093002
##
## [[460]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.8343
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1981
## Residual 0.9572
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.738888 0.009308 0.095126
##
## [[461]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.4906
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8601
## Residual 1.0253
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.85604 0.01040 0.09004
##
## [[462]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.0218
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.748
## Residual 1.198
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.433775 0.008938 0.096665
##
## [[463]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.2253
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5924
## Residual 0.7993
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.575083 0.006031 0.130222
##
## [[464]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.1979
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.843
## Residual 1.142
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.855827 0.001387 0.105750
##
## [[465]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.1475
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.511
## Residual 0.930
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 11.76876 -0.00505 0.10837
##
## [[466]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.9487
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.489
## Residual 1.014
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.278179 0.001219 0.105819
##
## [[467]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.4309
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.296
## Residual 1.220
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.586918 0.008192 0.122404
##
## [[468]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.5415
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9337
## Residual 0.7892
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.548667 0.008982 0.087532
##
## [[469]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.7021
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.394
## Residual 1.189
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 26.85325 -0.01793 0.08516
##
## [[470]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 92.3418
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.940
## Residual 1.493
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.193787 0.001592 0.090091
##
## [[471]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.1655
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7913
## Residual 0.9204
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.118253 0.007656 0.109686
##
## [[472]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.7133
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9716
## Residual 1.1671
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.084623 0.005544 0.093602
##
## [[473]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.389
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.68
## Residual 1.25
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.03283 -0.00409 0.10698
##
## [[474]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.7082
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.529
## Residual 1.064
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.296641 0.003471 0.109957
##
## [[475]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.4569
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2415
## Residual 0.9663
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.32531 0.01001 0.09577
##
## [[476]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.0992
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.877
## Residual 1.174
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -18.37974 0.01765 0.09182
##
## [[477]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.1352
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7250
## Residual 0.9241
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.66303 0.01086 0.09943
##
## [[478]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.6207
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.9423
## Residual 0.8781
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.5865100 0.0009184 0.0880992
##
## [[479]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.9904
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.851
## Residual 1.136
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.443218 0.007772 0.094362
##
## [[480]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.4787
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4704
## Residual 0.9941
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.95399 0.01055 0.09628
##
## [[481]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.0452
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.5184
## Residual 0.7291
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 24.71054 -0.01441 0.10912
##
## [[482]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.8696
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.7039
## Residual 0.7271
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.0621 0.0100 0.0906
##
## [[483]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.3107
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4357
## Residual 0.9303
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.05314 0.01080 0.09203
##
## [[484]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.7091
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.08766
## Residual 0.95418
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.16740 0.00676 0.09467
##
## [[485]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.6866
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.574
## Residual 1.160
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -17.93030 0.01734 0.12105
##
## [[486]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.2098
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5232
## Residual 1.1237
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.95917 0.01225 0.07769
##
## [[487]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.1537
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.389
## Residual 1.271
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.595e+00 6.609e-05 1.302e-01
##
## [[488]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 65.7209
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5753
## Residual 0.7257
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.987877 0.001633 0.081604
##
## [[489]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.5395
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4356
## Residual 0.8242
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.446560 0.002125 0.093392
##
## [[490]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.3379
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4364
## Residual 0.9834
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.483e+00 8.337e-05 9.563e-02
##
## [[491]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.9688
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8788
## Residual 0.9184
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.547132 -0.004556 0.097085
##
## [[492]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.6078
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4217
## Residual 0.8918
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.1546793 -0.0008166 0.1015620
##
## [[493]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.5607
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0872
## Residual 0.8546
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.77608 0.00642 0.11349
##
## [[494]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.1958
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.857
## Residual 1.042
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.469947 0.001701 0.084329
##
## [[495]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.9632
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.124
## Residual 1.068
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.0340588 -0.0006899 0.0981545
##
## [[496]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 60.5167
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1617
## Residual 0.4745
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.971612 0.004294 0.118467
##
## [[497]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.4654
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.320e-07
## Residual 1.098e+00
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.42542 0.00447 0.11348
## convergence code 0; 1 optimizer warnings; 0 lme4 warnings
##
## [[498]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.4837
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.349
## Residual 1.262
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.604293 0.008005 0.099513
##
## [[499]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.3233
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.468
## Residual 0.892
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.6306 0.0019 0.1044
##
## [[500]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.5983
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.205
## Residual 1.125
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.65104 0.00961 0.10125
##
## [[501]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.4698
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.662
## Residual 1.030
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.86175 0.01494 0.10068
##
## [[502]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 91.4462
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.666
## Residual 1.322
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.959382 0.008026 0.106711
##
## [[503]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.4351
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.531
## Residual 1.074
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.0462285 0.0000941 0.1034172
##
## [[504]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.8314
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6357
## Residual 0.9155
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.042054 0.002332 0.110112
##
## [[505]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.6586
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.617
## Residual 1.234
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -19.4840 0.0205 0.1013
##
## [[506]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.7055
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.320
## Residual 1.094
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -16.22089 0.01653 0.11753
##
## [[507]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.4859
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.628
## Residual 1.124
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.563632 0.004594 0.093609
##
## [[508]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.5542
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.271
## Residual 1.007
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.806268 0.001083 0.095091
##
## [[509]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.5163
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.281
## Residual 1.260
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.09775 0.01079 0.11049
##
## [[510]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.7808
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.987
## Residual 1.352
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.159536 0.006115 0.104307
##
## [[511]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.6601
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4897
## Residual 0.7534
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.34989 0.01504 0.11864
##
## [[512]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.5838
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0584
## Residual 0.9008
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.017045 -0.002115 0.108312
##
## [[513]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 68.645
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8396
## Residual 0.7533
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.67871 0.01138 0.09612
##
## [[514]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 90.082
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.46
## Residual 1.32
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.67519 0.00173 0.09251
##
## [[515]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.8389
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.633
## Residual 1.083
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.594145 -0.003525 0.090551
##
## [[516]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 64.6703
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4366
## Residual 0.5799
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.412440 0.000495 0.074868
##
## [[517]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.4415
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0140
## Residual 0.9198
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 29.32398 -0.02093 0.10077
##
## [[518]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.3388
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.384
## Residual 1.055
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.525053 0.005033 0.094507
##
## [[519]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.3413
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4124
## Residual 0.9825
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.242089 0.007244 0.109426
##
## [[520]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.7402
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9265
## Residual 0.9955
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.21395 0.01074 0.10597
##
## [[521]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 65.9113
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2674
## Residual 0.5768
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -20.24714 0.02115 0.09016
##
## [[522]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.704
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.675
## Residual 1.180
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.43110 0.01243 0.11351
##
## [[523]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.8071
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8758
## Residual 0.8916
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.65328 0.01322 0.10487
##
## [[524]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.8474
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.5238
## Residual 0.8208
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.40671 0.00688 0.08874
##
## [[525]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.2874
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.687
## Residual 1.014
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.837476 0.004638 0.115339
##
## [[526]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.6799
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.162
## Residual 1.128
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.900678 0.001497 0.104932
##
## [[527]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.9899
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.410
## Residual 1.083
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.8586273 -0.0003811 0.0737604
##
## [[528]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.2526
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.432
## Residual 1.017
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.22543 0.01427 0.11640
##
## [[529]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.285
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6822
## Residual 0.8147
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.361147 0.003804 0.094641
##
## [[530]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.9245
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.162
## Residual 1.054
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.567717 -0.002414 0.101091
##
## [[531]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.7551
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.822
## Residual 0.969
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.282246 0.007882 0.101790
##
## [[532]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.188
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7390
## Residual 0.7664
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.018512 -0.001341 0.093618
##
## [[533]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.3694
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.670
## Residual 1.077
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.44683 0.01314 0.10664
##
## [[534]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.6899
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4868
## Residual 0.7426
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.779559 0.002062 0.074600
##
## [[535]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.4062
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.163
## Residual 1.176
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -17.1665 0.0186 0.1145
##
## [[536]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.748
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.508
## Residual 1.123
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 15.1074 -0.0085 0.1114
##
## [[537]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.6563
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.9457
## Residual 0.9745
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.23807 0.01060 0.07336
##
## [[538]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 90.2371
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.953
## Residual 1.370
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.42941 0.01216 0.10358
##
## [[539]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.9697
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6216
## Residual 1.1567
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.675313 -0.001812 0.099809
##
## [[540]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 90.8391
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.579
## Residual 1.258
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.832840 -0.003116 0.109381
##
## [[541]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.2054
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.4482
## Residual 1.0734
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.98756 0.01401 0.10234
##
## [[542]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.4379
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1713
## Residual 0.9524
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.844651 0.004186 0.105423
##
## [[543]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.21
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.295
## Residual 1.067
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 19.09318 -0.01078 0.08830
##
## [[544]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.8397
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2314
## Residual 0.7851
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -16.34034 0.01723 0.09779
##
## [[545]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.919
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1980
## Residual 0.7314
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.93289 0.00243 0.08259
##
## [[546]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.0866
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.543
## Residual 1.106
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.910471 0.003343 0.095414
##
## [[547]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.7012
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.439
## Residual 1.082
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.234518 0.001616 0.083064
##
## [[548]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 66.9216
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 8.001e-09
## Residual 8.423e-01
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.382776 0.008519 0.096892
## convergence code 0; 1 optimizer warnings; 0 lme4 warnings
##
## [[549]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.2086
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5148
## Residual 0.9431
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 13.625387 -0.005871 0.085480
##
## [[550]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.839
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.378
## Residual 1.233
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 53.51632 -0.03486 0.08119
##
## [[551]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.6818
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8468
## Residual 0.9493
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.150107 -0.002908 0.096182
##
## [[552]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 61.6452
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9023
## Residual 0.5257
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.327130 0.007567 0.083394
##
## [[553]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.4625
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8669
## Residual 0.9426
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.7168241 0.0003071 0.0928394
##
## [[554]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.5015
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.286
## Residual 1.022
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 22.92902 -0.01250 0.09847
##
## [[555]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.3934
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1036
## Residual 0.7983
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -17.9804 0.0192 0.0978
##
## [[556]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.4624
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3103
## Residual 0.9264
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.713761 0.002227 0.113758
##
## [[557]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.2021
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9333
## Residual 0.9788
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.715717 0.005804 0.104251
##
## [[558]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.2241
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.035
## Residual 1.056
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.97629 0.01213 0.08290
##
## [[559]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.7557
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0364
## Residual 0.9431
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.649720 -0.000941 0.112180
##
## [[560]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.1112
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.143
## Residual 1.028
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 22.599137 -0.009888 0.073161
##
## [[561]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.1831
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2237
## Residual 0.9834
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.43851 0.01231 0.10502
##
## [[562]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.6421
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1647
## Residual 0.9208
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.627225 -0.001254 0.091955
##
## [[563]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.4393
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.2602
## Residual 0.9799
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.642483 0.006799 0.117696
##
## [[564]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.8286
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.014
## Residual 1.251
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.880856 0.002062 0.096135
##
## [[565]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.3712
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.069
## Residual 1.127
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.511024 0.004511 0.095408
##
## [[566]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.1123
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6049
## Residual 0.7123
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.036734 0.009541 0.093194
##
## [[567]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.5944
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.0445
## Residual 0.9871
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.220396 0.004895 0.107189
##
## [[568]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.9647
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.2924
## Residual 0.9556
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.84091 0.01246 0.13021
##
## [[569]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.0132
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.191
## Residual 1.232
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -19.69860 0.02103 0.10789
##
## [[570]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.6292
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3772
## Residual 0.9558
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.540707 0.008439 0.105338
##
## [[571]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.4849
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1498
## Residual 0.9506
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.406200 -0.003501 0.093804
##
## [[572]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.0429
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2248
## Residual 0.8008
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -14.09193 0.01416 0.11569
##
## [[573]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.7404
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7286
## Residual 0.8372
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.94294 0.01585 0.10692
##
## [[574]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.3716
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.3467
## Residual 0.9955
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.499051 0.004289 0.114230
##
## [[575]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.0795
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.333
## Residual 1.388
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.04422 0.01274 0.10253
##
## [[576]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.9231
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.666
## Residual 1.052
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.445634 -0.002895 0.102677
##
## [[577]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.7155
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.6769
## Residual 0.8407
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.12116 0.01179 0.10884
##
## [[578]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.5249
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0200
## Residual 0.6996
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.71802 0.01122 0.09867
##
## [[579]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 91.3834
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.361
## Residual 1.229
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.18311 0.01085 0.09017
##
## [[580]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.2654
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.967
## Residual 1.185
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 30.41110 -0.02386 0.07895
##
## [[581]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.7266
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.967
## Residual 1.051
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.47050 0.01510 0.07997
##
## [[582]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.8233
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.661
## Residual 1.012
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.891824 0.005177 0.099114
##
## [[583]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.1079
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1702
## Residual 0.7303
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -17.30421 0.01618 0.10875
##
## [[584]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.6244
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.851
## Residual 1.111
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -32.34970 0.02883 0.12148
##
## [[585]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.6695
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.347
## Residual 1.338
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -20.09661 0.02052 0.11347
##
## [[586]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.4409
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.039
## Residual 1.150
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.458656 0.007048 0.092820
##
## [[587]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.7362
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.6876
## Residual 0.8466
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.914682 0.006553 0.123463
##
## [[588]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.3322
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.6744
## Residual 0.9678
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.53408 0.01466 0.08286
##
## [[589]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.6115
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.5292
## Residual 0.9509
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.163625 0.001722 0.118735
##
## [[590]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.9259
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3439
## Residual 0.9302
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.047e+00 -8.427e-05 9.778e-02
##
## [[591]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.5692
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.6083
## Residual 0.9114
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.775145 0.007554 0.095276
##
## [[592]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.1437
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.334
## Residual 1.137
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.460311 0.008397 0.095553
##
## [[593]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.7628
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.605
## Residual 1.024
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.0961270 0.0007551 0.0923957
##
## [[594]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.1106
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9698
## Residual 0.9944
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.122167 0.002303 0.113841
##
## [[595]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.2657
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2141
## Residual 0.9175
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.55496 0.01399 0.09071
##
## [[596]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.7602
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0222
## Residual 0.9733
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.669763 -0.003596 0.091005
##
## [[597]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.5226
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7303
## Residual 0.9533
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -18.73754 0.01894 0.11088
##
## [[598]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.8807
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.022
## Residual 1.060
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.21438 0.01346 0.10324
##
## [[599]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.8503
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1975
## Residual 0.8511
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.50974 0.00559 0.10700
##
## [[600]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.6246
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.3998
## Residual 1.0500
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -17.87408 0.01650 0.09538
##
## [[601]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 58.9394
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0542
## Residual 0.5355
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.44032 0.00498 0.10676
##
## [[602]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.7631
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2238
## Residual 0.9631
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -24.09418 0.02618 0.08289
##
## [[603]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.3415
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.7976
## Residual 0.6675
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 12.889621 -0.005868 0.094534
##
## [[604]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.8451
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.879
## Residual 0.940
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.177715 0.005116 0.105908
##
## [[605]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.518
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.026
## Residual 1.280
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.47890 0.00777 0.10155
##
## [[606]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.7797
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.487
## Residual 1.211
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.489756 -0.002884 0.132255
##
## [[607]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.0813
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.8879
## Residual 0.9118
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.43814 0.01193 0.11781
##
## [[608]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.383
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.2805
## Residual 1.0603
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.97850 0.01453 0.09556
##
## [[609]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.4735
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.461
## Residual 1.040
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.19527 0.00840 0.09018
##
## [[610]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.0826
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.7450
## Residual 0.7772
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.373022 0.009163 0.097123
##
## [[611]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.2871
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1542
## Residual 0.6417
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.85743 0.00159 0.09461
##
## [[612]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.1783
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7803
## Residual 0.8976
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 15.478873 -0.008216 0.107213
##
## [[613]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.9307
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.688
## Residual 1.285
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.8900175 0.0001357 0.1184960
##
## [[614]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.618
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3518
## Residual 0.9607
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.00698 0.01397 0.08530
##
## [[615]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.7627
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.572
## Residual 1.060
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.686601 0.004242 0.068132
##
## [[616]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.609
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5831
## Residual 0.9802
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.495620 0.006488 0.064370
##
## [[617]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.3465
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8907
## Residual 0.8783
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.602e+00 -4.807e-05 1.237e-01
##
## [[618]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 66.0953
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1519
## Residual 0.6709
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.778942 0.007102 0.067873
##
## [[619]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.2244
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1155
## Residual 0.9746
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 11.006746 -0.004224 0.093506
##
## [[620]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.6077
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8178
## Residual 0.7145
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.036944 0.007431 0.106659
##
## [[621]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.149
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.593
## Residual 1.043
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -16.90293 0.01770 0.08716
##
## [[622]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.3449
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5095
## Residual 1.3049
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.881518 0.009833 0.088614
##
## [[623]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.2467
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 4.4246
## Residual 0.7458
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.29397 0.01397 0.10336
##
## [[624]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.9753
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6639
## Residual 1.0965
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.253252 0.002564 0.091308
##
## [[625]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.0123
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.5083
## Residual 0.9038
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.72066 0.00711 0.10351
##
## [[626]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.3286
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.5848
## Residual 0.7063
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.977542 0.003051 0.095545
##
## [[627]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 67.0972
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4391
## Residual 0.6046
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.137537 -0.006089 0.110411
##
## [[628]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.4067
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.7353
## Residual 0.9812
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -31.60586 0.02651 0.11662
##
## [[629]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.4936
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.073
## Residual 0.981
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.681316 0.003701 0.109684
##
## [[630]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.9021
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8625
## Residual 0.8282
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.08304 0.00524 0.11919
##
## [[631]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.0425
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.234
## Residual 1.168
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.84777 0.01599 0.09282
##
## [[632]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.8613
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7372
## Residual 1.1210
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.130525 0.005794 0.084935
##
## [[633]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.8581
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9033
## Residual 1.0547
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.381741 0.005143 0.083072
##
## [[634]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.6074
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2919
## Residual 0.9942
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -25.30045 0.02655 0.08138
##
## [[635]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.3514
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.071
## Residual 1.217
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.577493 0.006434 0.092413
##
## [[636]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.1616
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6856
## Residual 1.0510
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.4024363 -0.0002769 0.0628873
##
## [[637]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.8083
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2137
## Residual 0.8323
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.988314 0.008553 0.091037
##
## [[638]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.2277
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7856
## Residual 0.7928
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.593918 0.007981 0.080822
##
## [[639]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.247
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3398
## Residual 0.8571
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.17597 0.01019 0.10944
##
## [[640]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.7739
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.664
## Residual 1.092
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -23.32729 0.02118 0.13520
##
## [[641]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.4255
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6594
## Residual 0.8357
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.319788 0.002726 0.110103
##
## [[642]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.9998
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8564
## Residual 0.6844
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 11.91332 -0.00429 0.08857
##
## [[643]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.4371
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9031
## Residual 0.8003
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 29.21217 -0.01893 0.10352
##
## [[644]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.3947
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5693
## Residual 0.7231
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.165564 0.004886 0.099800
##
## [[645]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.8031
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.856
## Residual 1.340
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -14.94923 0.01663 0.09487
##
## [[646]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.8424
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8234
## Residual 0.9068
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.576082 0.008553 0.065143
##
## [[647]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.5416
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.754
## Residual 1.166
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.240577 0.002916 0.112360
##
## [[648]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.6962
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7833
## Residual 0.8922
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.29338 0.01211 0.07968
##
## [[649]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.2843
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 4.3250
## Residual 0.8443
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.111371 0.004366 0.089583
##
## [[650]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 66.8112
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2162
## Residual 0.6582
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.052730 0.008823 0.103425
##
## [[651]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.6476
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.1443
## Residual 0.9208
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.129854 -0.003338 0.105219
##
## [[652]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.9284
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.3878
## Residual 0.7865
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 17.894258 -0.008361 0.087332
##
## [[653]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.3282
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.3548
## Residual 0.8045
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.73423 0.01014 0.10492
##
## [[654]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.4019
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.195
## Residual 1.241
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.459177 0.005711 0.104306
##
## [[655]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.6225
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.3399
## Residual 0.9482
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.267062 -0.001392 0.116899
##
## [[656]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.4058
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7470
## Residual 0.9436
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 18.58794 -0.00867 0.05959
##
## [[657]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.066
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.515
## Residual 1.349
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 12.947959 -0.007387 0.085849
##
## [[658]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.6449
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6899
## Residual 0.8641
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 14.711574 -0.007637 0.093395
##
## [[659]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.1886
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0208
## Residual 0.8672
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.788792 0.001805 0.114799
##
## [[660]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.694
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.600
## Residual 1.046
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.562147 0.005497 0.113417
##
## [[661]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 66.8623
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.581
## Residual 0.634
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.735538 0.001232 0.086776
##
## [[662]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.1432
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2406
## Residual 0.8562
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 12.103426 -0.004294 0.107775
##
## [[663]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.4212
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.117
## Residual 0.838
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 17.224046 -0.008698 0.091098
##
## [[664]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.293
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7100
## Residual 0.8458
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 14.573899 -0.005832 0.108516
##
## [[665]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.6758
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.322
## Residual 1.133
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.25612 0.01029 0.08460
##
## [[666]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 66.0947
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.1486
## Residual 0.8083
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.224531 0.002707 0.087542
##
## [[667]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.2347
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8858
## Residual 1.2406
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.533493 0.009396 0.076337
##
## [[668]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.7907
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.617
## Residual 1.078
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.751506 0.002573 0.098568
##
## [[669]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.5318
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.618
## Residual 1.028
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.751527 0.005601 0.111543
##
## [[670]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.085
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7000
## Residual 0.9283
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.343326 -0.001907 0.119914
##
## [[671]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.6985
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.230
## Residual 1.288
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 17.143438 -0.008884 0.086000
##
## [[672]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.6895
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7925
## Residual 0.8212
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.6837107 0.0006246 0.1051148
##
## [[673]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.387
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.956
## Residual 1.006
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.753272 -0.002117 0.082200
##
## [[674]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.5662
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.641
## Residual 1.184
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.0773426 0.0005296 0.0927401
##
## [[675]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.1799
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.133
## Residual 1.091
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.500096 0.001787 0.107333
##
## [[676]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.6487
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6076
## Residual 1.2642
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.275469 0.005448 0.110438
##
## [[677]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.3569
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1771
## Residual 0.9924
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.8430071 -0.0008162 0.0731854
##
## [[678]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 68.1317
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.3138
## Residual 0.5934
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.688563 0.003979 0.097523
##
## [[679]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 91.6373
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.155
## Residual 1.442
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.208577 -0.002382 0.078272
##
## [[680]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.4981
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.000
## Residual 1.262
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.6181076 -0.0007731 0.1025428
## convergence code 0; 1 optimizer warnings; 0 lme4 warnings
##
## [[681]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.6039
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8405
## Residual 0.9045
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.825323 -0.002221 0.113693
##
## [[682]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.8532
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9774
## Residual 0.9657
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.793064 0.005834 0.072849
##
## [[683]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.2335
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6885
## Residual 0.8893
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.904113 0.008112 0.099052
##
## [[684]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.4713
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.899
## Residual 1.206
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.019733 0.004962 0.081219
##
## [[685]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.8905
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3426
## Residual 0.9153
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -18.93796 0.02131 0.08406
##
## [[686]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.8994
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.9237
## Residual 0.9746
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -35.97577 0.03223 0.09127
##
## [[687]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.9353
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.07511
## Residual 0.98140
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.1519239 -0.0002084 0.0990140
##
## [[688]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.359
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.228
## Residual 1.104
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.679441 -0.002856 0.111919
##
## [[689]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.3244
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.268
## Residual 1.097
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.069580 0.004558 0.099879
##
## [[690]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.3572
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2264
## Residual 0.7534
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.85471 0.01421 0.09572
##
## [[691]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.2823
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.775
## Residual 1.238
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.083367 0.003109 0.083348
##
## [[692]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.2385
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8465
## Residual 0.9908
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.511699 0.009339 0.101659
##
## [[693]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 90.2257
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.425
## Residual 1.207
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.8094536 0.0009767 0.0857325
##
## [[694]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.2619
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.146
## Residual 1.289
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.577155 0.005945 0.088322
##
## [[695]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.176
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2103
## Residual 0.9322
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.19720 0.00480 0.09442
##
## [[696]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.3926
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2052
## Residual 0.9335
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.84314 0.01254 0.10466
##
## [[697]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.5812
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.432
## Residual 0.904
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.41844 0.01227 0.09323
##
## [[698]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.2027
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.359
## Residual 1.018
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -17.70936 0.01586 0.12137
##
## [[699]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.3993
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8519
## Residual 0.8917
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.324684 0.004807 0.100272
##
## [[700]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.8156
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8981
## Residual 1.1628
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.945581 0.007135 0.102456
##
## [[701]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.917
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.117
## Residual 1.012
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.402913 0.003277 0.110890
##
## [[702]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.942
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1211
## Residual 0.6719
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 22.21660 -0.01282 0.09368
##
## [[703]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.3441
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.9710
## Residual 0.9133
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.953896 0.007393 0.095067
##
## [[704]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.168
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.384
## Residual 1.154
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.17878 0.01005 0.09688
##
## [[705]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.805
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4483
## Residual 0.9543
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.69704 0.01503 0.08963
##
## [[706]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.6468
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.942
## Residual 1.091
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.688549 0.002447 0.075583
##
## [[707]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.5983
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.1720
## Residual 0.6842
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.63649 0.00192 0.10659
##
## [[708]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.2474
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3105
## Residual 0.7704
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.008329 -0.002071 0.104630
##
## [[709]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.4391
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.5981
## Residual 0.8792
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.93040 0.01100 0.07694
##
## [[710]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.8484
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4284
## Residual 0.9916
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 15.761951 -0.008671 0.112804
##
## [[711]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 95.1279
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.765
## Residual 1.434
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.541913 0.005417 0.090910
##
## [[712]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.8633
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.277
## Residual 1.092
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.611471 0.003612 0.099815
##
## [[713]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.168
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7912
## Residual 0.7165
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.7063727 0.0001454 0.0828780
##
## [[714]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.0826
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1495
## Residual 0.8785
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -15.44497 0.01673 0.10553
##
## [[715]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.5048
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.561
## Residual 1.216
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.54525 0.01288 0.12161
##
## [[716]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 62.4895
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.1981
## Residual 0.7501
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 14.468173 -0.006087 0.077497
##
## [[717]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.6896
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5437
## Residual 0.9465
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -14.50907 0.01579 0.10948
##
## [[718]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.2342
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4604
## Residual 0.8374
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.783530 0.006672 0.092877
##
## [[719]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.6483
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.985
## Residual 1.160
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.29251 0.01114 0.09667
##
## [[720]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.4617
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9511
## Residual 0.8592
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.377283 0.003074 0.104033
##
## [[721]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.8315
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.214
## Residual 1.128
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.596691 0.003295 0.101636
##
## [[722]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.8258
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.390
## Residual 1.032
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.9706467 0.0008292 0.0719036
##
## [[723]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.1322
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3039
## Residual 0.9867
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.47324 0.00850 0.08589
##
## [[724]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.8472
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.788
## Residual 1.213
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.88127 0.00106 0.12822
##
## [[725]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.5571
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.967
## Residual 1.072
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.26922 0.01285 0.11484
##
## [[726]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.8109
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.159
## Residual 1.061
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.157e+00 6.969e-05 9.647e-02
##
## [[727]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.438
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6602
## Residual 1.0778
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.823663 0.001718 0.085749
##
## [[728]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.1908
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.749
## Residual 1.115
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.707416 -0.002932 0.101208
##
## [[729]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.384
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.6793
## Residual 0.9698
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.290343 0.007698 0.095959
##
## [[730]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.1122
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.0546
## Residual 0.9934
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.11038 0.01083 0.13257
##
## [[731]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.5125
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7302
## Residual 0.6707
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.150979 0.009806 0.101335
##
## [[732]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.5641
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.288
## Residual 1.103
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.241707 0.004116 0.093451
##
## [[733]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.4888
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5031
## Residual 0.9106
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 12.189484 -0.004644 0.082802
##
## [[734]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.3505
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2901
## Residual 0.7985
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.78413 0.01061 0.10696
##
## [[735]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 67.4874
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9063
## Residual 0.7170
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 13.088299 -0.005816 0.096943
##
## [[736]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.4801
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0697
## Residual 0.9533
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.721347 -0.005298 0.124401
##
## [[737]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.8
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.771
## Residual 1.216
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.159182 0.004354 0.113917
##
## [[738]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.2405
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.415
## Residual 0.906
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 16.086009 -0.007895 0.085827
##
## [[739]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 68.0196
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0085
## Residual 0.7143
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.860864 0.002214 0.084497
##
## [[740]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.9036
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1012
## Residual 0.8731
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.130e+00 7.708e-06 8.611e-02
##
## [[741]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.4286
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0735
## Residual 0.7592
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.230266 -0.001976 0.090624
##
## [[742]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 66.8487
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7690
## Residual 0.7292
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.19007 0.01139 0.12559
##
## [[743]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.9765
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.518
## Residual 0.908
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.685629 -0.004357 0.112441
##
## [[744]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.6319
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9418
## Residual 1.2418
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.76037 0.01587 0.09859
##
## [[745]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.9634
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.4150
## Residual 0.9325
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.917931 0.009925 0.100135
##
## [[746]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.5608
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.3488
## Residual 0.5862
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.125911 0.002038 0.105633
##
## [[747]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.3007
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2893
## Residual 0.8019
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -19.31672 0.01760 0.09757
##
## [[748]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.0857
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4979
## Residual 0.7636
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 14.198296 -0.005737 0.104625
##
## [[749]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 65.8349
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8049
## Residual 0.5571
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.799596 -0.001702 0.096839
##
## [[750]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.6397
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.511
## Residual 1.044
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.970479 0.002219 0.099952
##
## [[751]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.7104
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7648
## Residual 0.8969
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.30029 0.00292 0.10978
##
## [[752]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.0854
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.005
## Residual 0.798
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.7802138 -0.0006947 0.0952106
##
## [[753]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.7647
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.822
## Residual 1.025
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.860642 -0.004333 0.088975
##
## [[754]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.4268
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3524
## Residual 0.9651
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.0138956 0.0005809 0.1100564
##
## [[755]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.5714
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8601
## Residual 0.8379
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.517828 0.009854 0.095720
##
## [[756]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 91.3033
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.153
## Residual 1.387
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.64476 0.01287 0.13049
##
## [[757]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 68.3466
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5817
## Residual 0.8147
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.658285 0.005299 0.102965
##
## [[758]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.2035
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.609
## Residual 1.160
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.941871 0.003162 0.099006
##
## [[759]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.8565
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.3232
## Residual 0.8782
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 17.849488 -0.009073 0.109583
##
## [[760]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.5162
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5789
## Residual 0.9712
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.94948 0.00709 0.09627
##
## [[761]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.3621
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.7944
## Residual 0.8057
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.313989 0.001066 0.119973
##
## [[762]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.9136
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.1810
## Residual 0.7066
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.511383 0.008802 0.115950
##
## [[763]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.1391
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.0780
## Residual 0.9751
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.754403 0.001896 0.122301
##
## [[764]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.994
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4415
## Residual 0.9207
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 22.05502 -0.01394 0.09579
##
## [[765]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.8914
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2864
## Residual 0.9625
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 13.966925 -0.005077 0.098268
##
## [[766]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.6709
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.382
## Residual 1.299
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.193621 -0.003756 0.090726
##
## [[767]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.2911
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7043
## Residual 1.1931
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.156990 0.004572 0.100791
##
## [[768]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.0892
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1780
## Residual 0.8678
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.95624 0.01309 0.09196
##
## [[769]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.2531
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2459
## Residual 0.8696
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.717691 -0.001271 0.091015
##
## [[770]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 67.9521
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6643
## Residual 0.7824
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 18.89031 -0.01212 0.07000
##
## [[771]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.0437
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.313
## Residual 1.233
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.459905 0.005056 0.087630
##
## [[772]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.7843
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0266
## Residual 0.7794
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.11300 0.01429 0.11196
##
## [[773]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.8409
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.0079
## Residual 0.9247
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.459770 0.004255 0.084493
##
## [[774]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.7903
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8752
## Residual 1.1240
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.013514 0.003203 0.120569
##
## [[775]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.9363
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.026
## Residual 0.801
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.273661 0.009448 0.131800
##
## [[776]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.2121
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.297
## Residual 1.007
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 12.169700 -0.006517 0.096966
##
## [[777]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.4169
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.4017
## Residual 0.9760
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.13040 0.00975 0.10226
##
## [[778]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.5029
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6654
## Residual 0.7944
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.576435 0.002326 0.120114
##
## [[779]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.311
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4999
## Residual 0.7903
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 13.087286 -0.006909 0.084267
##
## [[780]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.8858
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1216
## Residual 0.7965
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.757544 0.001979 0.093143
##
## [[781]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.6632
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8704
## Residual 0.7871
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.571985 0.002339 0.108892
##
## [[782]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.5259
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.368
## Residual 1.200
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 12.214865 -0.004822 0.114663
##
## [[783]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.1316
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6848
## Residual 0.8512
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.19265 0.01457 0.09262
##
## [[784]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 57.8945
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.4007
## Residual 0.5917
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.175947 0.006727 0.089567
##
## [[785]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.8783
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.449
## Residual 1.228
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.633214 -0.003546 0.113378
##
## [[786]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.7596
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4566
## Residual 0.8735
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.893150 0.002283 0.084338
##
## [[787]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 90.9216
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.299
## Residual 1.334
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.295e+00 -7.328e-05 1.035e-01
##
## [[788]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.3776
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2973
## Residual 0.9953
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.709858 -0.001214 0.122067
##
## [[789]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.4086
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.756
## Residual 1.174
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.759804 0.002021 0.099126
##
## [[790]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.9837
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4963
## Residual 0.9041
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 11.310971 -0.004036 0.097158
##
## [[791]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.3186
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6025
## Residual 0.9913
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.1286486 -0.0008338 0.1050423
##
## [[792]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.9325
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9972
## Residual 1.2095
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 23.16091 -0.01542 0.09547
##
## [[793]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.255
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.973
## Residual 0.954
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.18232 0.01267 0.11046
##
## [[794]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 66.883
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4817
## Residual 0.6713
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -24.06559 0.02173 0.10544
##
## [[795]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.9693
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.856
## Residual 0.752
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.064127 0.004324 0.085032
##
## [[796]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.1157
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.198
## Residual 1.019
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 13.85554 -0.00458 0.08841
##
## [[797]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.6409
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.7290
## Residual 0.8823
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 25.16081 -0.01631 0.12304
##
## [[798]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.0576
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5139
## Residual 0.7756
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.619671 0.008453 0.098143
##
## [[799]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.2915
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.324
## Residual 1.078
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.843267 -0.001936 0.120976
##
## [[800]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.1474
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.631
## Residual 1.119
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.62530 0.01451 0.09797
##
## [[801]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.5763
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.201
## Residual 1.339
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.959937 -0.003996 0.091208
##
## [[802]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.7991
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9360
## Residual 0.9489
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.595535 0.001344 0.113456
##
## [[803]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.3029
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.863
## Residual 1.363
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.630554 0.004891 0.095394
##
## [[804]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.2187
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.349
## Residual 1.142
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.889931 0.008722 0.097608
##
## [[805]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.4214
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0790
## Residual 0.8113
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.718834 0.005707 0.088830
##
## [[806]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.3069
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4151
## Residual 0.8997
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.2700325 0.0006261 0.1162007
##
## [[807]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.8963
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6089
## Residual 0.8312
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.377878 0.001628 0.113477
##
## [[808]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.9403
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6634
## Residual 0.9106
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.139001 0.009899 0.108416
##
## [[809]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.4756
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5437
## Residual 0.8075
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.956682 -0.005096 0.094539
##
## [[810]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.0201
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6219
## Residual 1.1262
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.99778 0.01071 0.10634
##
## [[811]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.4873
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4275
## Residual 0.9559
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.463738 0.009264 0.097345
##
## [[812]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.4435
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.151
## Residual 1.140
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.980972 -0.006562 0.105197
##
## [[813]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.8391
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4047
## Residual 0.6909
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 15.690919 -0.005984 0.095714
##
## [[814]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.2124
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.215
## Residual 1.200
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.842480 0.004506 0.085411
##
## [[815]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.23
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1824
## Residual 0.9633
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.777141 0.001513 0.094082
##
## [[816]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.9652
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.684
## Residual 1.142
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.56682 0.01107 0.08214
##
## [[817]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.6431
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9459
## Residual 0.9455
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.702379 -0.003617 0.083277
##
## [[818]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.4329
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7678
## Residual 0.9173
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 21.75715 -0.01461 0.10920
##
## [[819]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.0729
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8545
## Residual 0.7938
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.438990 0.001463 0.115495
##
## [[820]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.0535
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4316
## Residual 0.9018
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.753614 -0.002383 0.100042
##
## [[821]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.5252
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4567
## Residual 0.9359
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.510057 0.001226 0.094171
##
## [[822]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.7328
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7013
## Residual 0.9308
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.708683 0.005596 0.104601
##
## [[823]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.7486
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.017
## Residual 1.137
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 23.95212 -0.01745 0.11595
##
## [[824]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.2971
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.327
## Residual 0.943
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.805788 0.004759 0.114640
##
## [[825]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.8957
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9975
## Residual 0.7478
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.08396 0.01567 0.10254
##
## [[826]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.9774
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.646
## Residual 1.189
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.684054 -0.001123 0.108929
##
## [[827]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.1261
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.717
## Residual 1.106
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.140541 -0.002134 0.134556
##
## [[828]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.5549
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.937
## Residual 1.008
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.428333 -0.002343 0.093428
##
## [[829]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.0169
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.353
## Residual 1.003
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.224462 0.003449 0.083641
##
## [[830]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.268
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1899
## Residual 0.7806
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.93566 -0.00593 0.11253
##
## [[831]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.9136
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6188
## Residual 0.9299
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.507310 0.007449 0.109711
##
## [[832]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.2525
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9714
## Residual 0.8486
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.18017 0.01425 0.11690
##
## [[833]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.3498
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2079
## Residual 0.9958
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -42.29342 0.03894 0.11502
##
## [[834]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.4252
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.883
## Residual 1.042
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.796856 0.007705 0.115894
##
## [[835]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 68.6357
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0277
## Residual 0.7258
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.095133 0.006549 0.095141
##
## [[836]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.1702
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.4013
## Residual 0.9338
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 13.736522 -0.006791 0.096861
##
## [[837]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.4392
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.368
## Residual 1.215
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.99400 0.01041 0.10456
##
## [[838]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.1937
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.3063
## Residual 0.9873
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.02181 0.01039 0.11102
##
## [[839]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.5372
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.773
## Residual 1.118
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 22.20960 -0.01521 0.12025
##
## [[840]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.1327
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.9587
## Residual 0.8476
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.58583 0.01415 0.06884
##
## [[841]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.126
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9722
## Residual 0.7529
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.151280 0.005981 0.104341
##
## [[842]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.4627
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0309
## Residual 0.9744
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.71579 0.01103 0.10258
##
## [[843]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.8036
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.900
## Residual 1.081
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.78812 0.01139 0.09273
##
## [[844]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.145
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2999
## Residual 0.6903
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.94344 0.01187 0.10392
##
## [[845]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.6134
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.9112
## Residual 0.9655
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.725473 0.007561 0.111220
##
## [[846]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.4867
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9798
## Residual 1.1692
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -14.15215 0.01628 0.09078
##
## [[847]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.5596
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5949
## Residual 1.1525
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.2338 0.0076 0.1167
##
## [[848]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.6608
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5596
## Residual 1.1346
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -30.48591 0.02558 0.09972
##
## [[849]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.2258
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7326
## Residual 0.9386
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.0760036 -0.0008814 0.1063350
##
## [[850]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.091
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.885
## Residual 0.937
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -14.26549 0.01585 0.09840
##
## [[851]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.6092
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 5.367e-09
## Residual 9.233e-01
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.459990 -0.003487 0.114185
## convergence code 0; 1 optimizer warnings; 0 lme4 warnings
##
## [[852]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.1495
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0257
## Residual 0.8885
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.868592 0.003349 0.108331
##
## [[853]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.5579
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.3211
## Residual 0.9743
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 20.60536 -0.01324 0.11544
##
## [[854]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.4771
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9243
## Residual 0.8507
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -18.88310 0.02093 0.10099
##
## [[855]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.0755
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6371
## Residual 0.8799
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 11.134686 -0.003907 0.088641
##
## [[856]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.7716
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5802
## Residual 0.9654
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.78592 0.01447 0.09575
##
## [[857]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 93.4565
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.684
## Residual 1.419
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.724022 -0.001909 0.103396
##
## [[858]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.6389
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0325
## Residual 0.9435
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.629295 0.006055 0.084227
##
## [[859]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.9766
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.337
## Residual 1.141
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.403631 0.005915 0.112142
##
## [[860]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.6173
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.539
## Residual 1.265
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.340154 0.006654 0.101844
##
## [[861]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.6152
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4218
## Residual 0.8775
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 11.771083 -0.005653 0.088789
##
## [[862]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.0154
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.1231
## Residual 0.9213
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.25572 0.01436 0.09149
##
## [[863]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.2808
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5239
## Residual 0.9861
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.0985141 -0.0007085 0.0697095
##
## [[864]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.9766
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.491
## Residual 1.023
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.691084 0.002731 0.090028
##
## [[865]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 65.3037
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.7372
## Residual 0.5167
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.21777 0.01373 0.09763
##
## [[866]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.9805
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.458
## Residual 1.040
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.9651542 0.0007898 0.1127722
##
## [[867]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 93.2269
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.565
## Residual 1.370
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.489872 0.008506 0.105767
##
## [[868]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.4979
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.269
## Residual 1.019
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.47474 0.00855 0.08685
##
## [[869]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.213
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9568
## Residual 0.9198
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.860415 0.007591 0.086314
##
## [[870]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.9661
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.4647
## Residual 0.9752
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.294087 0.003867 0.095822
##
## [[871]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 62.5543
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3381
## Residual 0.6111
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 56.71202 -0.03993 0.10685
##
## [[872]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 53.2832
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6289
## Residual 0.4708
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.30263 0.01359 0.09628
##
## [[873]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.4534
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.419
## Residual 1.075
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.24772 0.01218 0.08133
##
## [[874]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.6301
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.125
## Residual 1.179
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.388538 -0.002442 0.089109
##
## [[875]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.4101
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0437
## Residual 0.8211
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.64205 -0.00208 0.08970
##
## [[876]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 67.8348
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.955
## Residual 0.738
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.5961332 -0.0008699 0.1123932
##
## [[877]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.4913
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.470
## Residual 1.058
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -22.43660 0.02125 0.09528
##
## [[878]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.1665
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5717
## Residual 0.8885
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.25220 0.01420 0.09983
##
## [[879]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.9914
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.270
## Residual 0.907
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.128816 0.002495 0.095503
##
## [[880]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.4412
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.641
## Residual 1.226
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.220331 0.004739 0.105242
##
## [[881]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.4186
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.570
## Residual 1.081
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.206171 0.002969 0.119948
##
## [[882]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.056
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6245
## Residual 0.7334
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.189632 0.004387 0.104520
##
## [[883]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.7215
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.544
## Residual 0.890
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -16.11364 0.01575 0.11075
##
## [[884]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.1504
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1447
## Residual 0.8666
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -14.47856 0.01536 0.11318
##
## [[885]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.5296
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 9.413e-09
## Residual 1.350e+00
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.74170 0.01355 0.10732
## convergence code 0; 1 optimizer warnings; 0 lme4 warnings
##
## [[886]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.0316
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9600
## Residual 0.9623
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.552437 0.005214 0.098229
##
## [[887]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.5857
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.497
## Residual 1.221
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.3512027 0.0001949 0.1153535
##
## [[888]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.2919
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.489
## Residual 1.082
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.03374 0.01580 0.07364
##
## [[889]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.1315
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.3985
## Residual 0.8447
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.473505 0.008358 0.112781
##
## [[890]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.3976
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.781
## Residual 1.099
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -39.48947 0.03765 0.10659
##
## [[891]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.427
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8954
## Residual 1.0894
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -11.24317 0.01415 0.08018
##
## [[892]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.6058
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9418
## Residual 0.7842
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.2292854 0.0002175 0.1109911
##
## [[893]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.7412
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.182
## Residual 1.188
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.38552 0.00786 0.08927
##
## [[894]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.9295
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2169
## Residual 0.9398
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.864768 0.002901 0.115533
##
## [[895]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.4566
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5975
## Residual 0.6827
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.613286 0.007227 0.135941
##
## [[896]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.3044
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.449
## Residual 1.281
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.160845 0.007142 0.095272
##
## [[897]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.2998
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.6154
## Residual 0.7666
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 11.187502 -0.004038 0.092597
##
## [[898]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.9219
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8516
## Residual 0.8846
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.77970 0.01546 0.08502
##
## [[899]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.3149
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8154
## Residual 0.8328
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 15.341944 -0.008168 0.069126
##
## [[900]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.8367
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.478
## Residual 1.179
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.931410 0.006318 0.107842
##
## [[901]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.8982
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.3265
## Residual 1.1004
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.633849 -0.002173 0.110657
##
## [[902]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.0485
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4209
## Residual 0.9256
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 14.33784 -0.00721 0.09249
##
## [[903]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.5168
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0773
## Residual 0.9414
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.16686 0.01488 0.08809
##
## [[904]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.2892
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.031
## Residual 1.077
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -4.594250 0.007783 0.097100
##
## [[905]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.3755
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.144
## Residual 1.081
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.6426 0.0121 0.1064
##
## [[906]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.4035
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.062e-07
## Residual 1.180e+00
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -21.90886 0.02118 0.11789
## convergence code 0; 1 optimizer warnings; 0 lme4 warnings
##
## [[907]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.6373
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.112
## Residual 1.052
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.827462 0.004101 0.107729
##
## [[908]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.5124
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.1291
## Residual 0.9889
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.34201 0.01451 0.08114
##
## [[909]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.8798
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.389
## Residual 1.033
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.98600 0.01563 0.07825
##
## [[910]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.2853
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.907
## Residual 1.265
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.76542 0.01558 0.09649
##
## [[911]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.88
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.505
## Residual 1.100
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.937616 -0.004744 0.105766
##
## [[912]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.5162
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.1166
## Residual 0.7141
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.917247 -0.001702 0.075698
##
## [[913]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.4073
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.481
## Residual 1.217
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.4560145 0.0008324 0.0974967
##
## [[914]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.5879
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.146
## Residual 1.233
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 15.539822 -0.007016 0.089615
##
## [[915]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.1598
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7409
## Residual 1.1978
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -25.97376 0.02803 0.10286
##
## [[916]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.8084
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.223
## Residual 1.197
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -55.19666 0.04521 0.10664
##
## [[917]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.976
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.052
## Residual 1.223
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.306370 0.001121 0.079504
##
## [[918]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.8691
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4336
## Residual 0.7349
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.91800 0.01101 0.08657
##
## [[919]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 64.4845
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8568
## Residual 0.6505
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.053975 0.002508 0.101053
##
## [[920]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.4139
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.761
## Residual 1.183
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.78456 -0.00179 0.10980
##
## [[921]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.9035
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.2459
## Residual 0.8381
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.5849010 -0.0001394 0.0838601
##
## [[922]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.7687
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.444
## Residual 1.011
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -17.44485 0.01691 0.11839
##
## [[923]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.0024
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.2698
## Residual 1.0317
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.334561 0.003814 0.108143
##
## [[924]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.3598
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.3854
## Residual 0.9779
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -17.86938 0.02000 0.09769
##
## [[925]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.219
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.129
## Residual 1.126
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -12.66231 0.01707 0.09812
##
## [[926]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.757
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6257
## Residual 0.7799
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -38.08937 0.04051 0.10811
##
## [[927]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.6315
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.3285
## Residual 0.8631
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.830865 0.007499 0.081841
##
## [[928]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 71.294
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9483
## Residual 0.7085
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.67702 0.01423 0.10486
##
## [[929]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.8684
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.169
## Residual 1.051
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.692396 -0.000887 0.110646
##
## [[930]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.9301
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.102
## Residual 1.075
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 9.0710946 -0.0009939 0.0914319
##
## [[931]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.0733
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4261
## Residual 0.9819
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.114067 0.002628 0.093168
##
## [[932]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.8304
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.479
## Residual 1.014
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -1.273763 0.004358 0.109013
##
## [[933]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.4534
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4579
## Residual 0.8627
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 5.6655511 -0.0007718 0.0909335
##
## [[934]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.1594
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 4.0416
## Residual 0.9796
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.741305 0.004857 0.100943
##
## [[935]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.9749
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.474
## Residual 1.222
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.720722 0.002835 0.081450
##
## [[936]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.1378
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8410
## Residual 0.9418
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.28984 0.00803 0.11914
##
## [[937]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 88.1294
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.425
## Residual 1.347
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.5200543 0.0007857 0.0979182
##
## [[938]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.1185
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.103
## Residual 1.136
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.091692 0.009387 0.108719
##
## [[939]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.0225
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.378
## Residual 1.173
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.678000 0.006096 0.091880
##
## [[940]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 89.3973
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.634
## Residual 1.175
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.59837 0.01095 0.09302
##
## [[941]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 58.3534
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.8332
## Residual 0.5190
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.671351 0.001912 0.112529
##
## [[942]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.1472
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.849
## Residual 1.058
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.521245 0.003172 0.100989
##
## [[943]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.0712
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4397
## Residual 0.9519
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.352264 0.008005 0.091677
##
## [[944]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.8844
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5246
## Residual 1.0032
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.424445 -0.001117 0.081108
##
## [[945]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.5342
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.559
## Residual 1.031
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.70861 0.01129 0.10989
##
## [[946]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 84.0227
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.719
## Residual 1.162
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 15.215910 -0.007461 0.134581
##
## [[947]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.4069
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.0722
## Residual 0.8284
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.88375 -0.00149 0.11272
##
## [[948]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 87.0658
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.742
## Residual 1.141
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.621296 0.004742 0.087334
##
## [[949]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.11
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.4905
## Residual 0.7535
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.0382645 -0.0008325 0.0915238
##
## [[950]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.2676
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2641
## Residual 0.8352
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.713e+00 -8.061e-05 1.071e-01
##
## [[951]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 90.0003
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.014
## Residual 1.318
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.359506 0.001942 0.112894
##
## [[952]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.2108
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.3789
## Residual 0.9625
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.690428 0.001665 0.092023
##
## [[953]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.9143
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.122
## Residual 0.828
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.16749 0.00597 0.10146
##
## [[954]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 69.9265
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8613
## Residual 0.6036
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.67335 0.00992 0.12219
##
## [[955]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.6674
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6410
## Residual 0.7375
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.7325424 -0.0005987 0.0807563
##
## [[956]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.1818
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.6381
## Residual 0.6707
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.596011 0.009998 0.116742
##
## [[957]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.2018
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.8520
## Residual 0.9647
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 14.880393 -0.005873 0.109286
##
## [[958]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.829
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.9561
## Residual 0.7948
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.038988 0.001528 0.099931
##
## [[959]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.6099
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.989
## Residual 1.009
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -15.80357 0.01602 0.09264
##
## [[960]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.6443
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5326
## Residual 0.8637
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.438201 -0.003019 0.089901
##
## [[961]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 86.1888
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.557
## Residual 1.270
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.095144 0.004944 0.136927
##
## [[962]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 66.3935
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.5015
## Residual 0.7523
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.615475 0.006456 0.108579
##
## [[963]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.4787
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.6896
## Residual 0.9353
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.643127 0.002149 0.086121
##
## [[964]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.48
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.8428
## Residual 0.7397
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -3.730776 0.007508 0.110846
##
## [[965]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.9616
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7270
## Residual 0.9294
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 4.3120885 0.0007331 0.1085729
##
## [[966]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.3628
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.5400
## Residual 0.8733
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.51102 0.01136 0.09753
##
## [[967]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.2925
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.5096
## Residual 0.9193
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 12.288354 -0.005295 0.102687
##
## [[968]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.4233
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9401
## Residual 1.2206
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.745708 0.003327 0.115235
##
## [[969]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.5072
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.7077
## Residual 0.8061
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.330038 0.003791 0.107495
##
## [[970]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 93.2137
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.777
## Residual 1.483
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.475505 0.006627 0.096496
##
## [[971]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.8423
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.6319
## Residual 0.9242
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -8.96588 0.01081 0.09939
##
## [[972]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.9905
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9574
## Residual 0.8838
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.472e+00 -8.728e-05 7.163e-02
##
## [[973]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.5977
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.411
## Residual 1.165
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 7.37748 -0.00191 0.07640
##
## [[974]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.4905
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.8554
## Residual 0.9443
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 15.794664 -0.008211 0.107671
##
## [[975]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.8407
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.241
## Residual 0.776
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -7.82083 0.01033 0.10075
##
## [[976]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.2934
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.945
## Residual 0.819
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -6.909949 0.009298 0.121748
##
## [[977]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.19
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6026
## Residual 0.9595
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.457574 -0.006078 0.110430
##
## [[978]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.0304
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.9623
## Residual 0.9073
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 14.09178 -0.00749 0.10475
##
## [[979]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.3346
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.065
## Residual 1.043
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.237772 0.005038 0.101972
##
## [[980]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.5038
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3430
## Residual 0.8094
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.104880 0.004268 0.089291
##
## [[981]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.9786
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.0014
## Residual 0.9772
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.440e+00 -8.918e-05 1.046e-01
##
## [[982]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.965
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.188
## Residual 0.782
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 1.872173 0.003024 0.090136
##
## [[983]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 77.6607
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.018
## Residual 0.970
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 10.390237 -0.004947 0.111789
##
## [[984]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.736
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.0205
## Residual 0.9497
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.371834 0.004226 0.085245
##
## [[985]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 70.137
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6069
## Residual 0.6798
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.377216 0.003784 0.103677
##
## [[986]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 80.0343
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2066
## Residual 0.9283
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 2.663701 0.001425 0.103032
##
## [[987]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 79.6313
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.972
## Residual 0.952
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -13.08339 0.01409 0.10082
##
## [[988]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 72.6479
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.6543
## Residual 0.7576
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -5.85311 0.01003 0.09104
##
## [[989]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 82.9664
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 3.062
## Residual 1.014
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 19.47121 -0.00991 0.07643
##
## [[990]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 85.9944
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.949
## Residual 1.181
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -19.48655 0.02064 0.09326
##
## [[991]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.1815
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.2445
## Residual 0.9816
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -0.10757 0.00378 0.10297
##
## [[992]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 76.0459
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7492
## Residual 1.0072
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 6.11205 -0.00186 0.10317
##
## [[993]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.8486
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.5061
## Residual 0.8745
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 8.67602 -0.00337 0.10009
##
## [[994]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.7845
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.579
## Residual 1.064
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -10.93892 0.01348 0.09918
##
## [[995]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 75.6524
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.7504
## Residual 0.9694
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -2.557149 0.005906 0.105846
##
## [[996]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 81.9677
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.117
## Residual 1.165
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 21.44349 -0.01396 0.10501
##
## [[997]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 73.3137
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.4823
## Residual 0.8352
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## -9.38000 0.01103 0.09515
##
## [[998]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 78.3643
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 0.6166
## Residual 1.1038
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 0.840980 0.005089 0.084460
##
## [[999]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 83.9657
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 2.628
## Residual 1.053
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 3.0727412 0.0001542 0.1027728
##
## [[1000]]
## Linear mixed model fit by REML ['lmerModLmerTest']
## Formula: resp2 ~ 1 + elevation + slope + (1 | stand)
## Data: dat
## REML criterion at convergence: 74.2353
## Random effects:
## Groups Name Std.Dev.
## stand (Intercept) 1.3866
## Residual 0.8698
## Number of obs: 20, groups: stand, 5
## Fixed Effects:
## (Intercept) elevation slope
## 23.39999 -0.01399 0.10418
length(simulationfunc_result)
## [1] 1000
library(tidyverse)
## ── Attaching packages ──────────────────────── tidyverse 1.2.1 ──
## ✔ ggplot2 3.1.1 ✔ purrr 0.2.5
## ✔ tibble 2.1.3 ✔ dplyr 0.8.1
## ✔ tidyr 0.8.2 ✔ stringr 1.3.1
## ✔ readr 1.3.1 ✔ forcats 0.3.0
## ── Conflicts ─────────────────────────── tidyverse_conflicts() ──
## ✖ tidyr::expand() masks Matrix::expand()
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag() masks stats::lag()
library(broom)
variances <- simulationfunc_result %>% map_dfr(tidy, effects = "ran_pars", scales = "vcov")
variances %>% print(n = 6)
## # A tibble: 2,000 x 3
## term group estimate
## <chr> <chr> <dbl>
## 1 var_(Intercept).stand stand 2.61
## 2 var_Observation.Residual Residual 1.11
## 3 var_(Intercept).stand stand 9.73
## 4 var_Observation.Residual Residual 1.36
## 5 var_(Intercept).stand stand 0.827
## 6 var_Observation.Residual Residual 0.914
## # … with 1,994 more rows
head(variances)
## # A tibble: 6 x 3
## term group estimate
## <chr> <chr> <dbl>
## 1 var_(Intercept).stand stand 2.61
## 2 var_Observation.Residual Residual 1.11
## 3 var_(Intercept).stand stand 9.73
## 4 var_Observation.Residual Residual 1.36
## 5 var_(Intercept).stand stand 0.827
## 6 var_Observation.Residual Residual 0.914
head(variances,6)
## # A tibble: 6 x 3
## term group estimate
## <chr> <chr> <dbl>
## 1 var_(Intercept).stand stand 2.61
## 2 var_Observation.Residual Residual 1.11
## 3 var_(Intercept).stand stand 9.73
## 4 var_Observation.Residual Residual 1.36
## 5 var_(Intercept).stand stand 0.827
## 6 var_Observation.Residual Residual 0.914
library(ggplot2)
library(rlang)
##
## Attaching package: 'rlang'
## The following objects are masked from 'package:purrr':
##
## %@%, %||%, as_function, flatten, flatten_chr, flatten_dbl,
## flatten_int, flatten_lgl, invoke, list_along, modify, prepend,
## rep_along, splice
stand_sims = c(5, 20, 100) %>%
set_names() %>%
map(~replicate(1000, simulationfunc(nstand = .x) ) )
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
## singular fit
stand_vars = stand_sims %>%
modify_depth(2, ~tidy(.x, effects = "ran_pars", scales = "vcov") ) %>%
map_dfr(bind_rows, .id = "stand_num") %>%
filter(group == "stand")
head(stand_vars)
## # A tibble: 6 x 4
## stand_num term group estimate
## <chr> <chr> <chr> <dbl>
## 1 5 var_(Intercept).stand stand 12.0
## 2 5 var_(Intercept).stand stand 6.84
## 3 5 var_(Intercept).stand stand 2.89
## 4 5 var_(Intercept).stand stand 2.52
## 5 5 var_(Intercept).stand stand 0.966
## 6 5 var_(Intercept).stand stand 2.91
ggplot(stand_vars, aes(x = estimate) ) +
geom_density(fill = "blue", alpha = .25) +
facet_wrap(~stand_num) +
geom_vline(xintercept = 4)
stand_vars = mutate(stand_vars, stand_num = forcats::fct_inorder(stand_num) )
add_prefix = function(string) {
paste("Number stands:", string, sep = " ")
}
groupmed = stand_vars %>%
group_by(stand_num) %>%
summarise(mvar = median(estimate) )
ggplot(stand_vars, aes(x = estimate) ) +
geom_density(fill = "green", alpha = .25) +
facet_wrap(~stand_num, labeller = as_labeller(add_prefix) ) +
geom_vline(aes(xintercept = 4, linetype = "True variance"), size = .5 ) +
geom_vline(data = groupmed, aes(xintercept = mvar, linetype = "Median variance"), size = .5)
library(furrr)
## Loading required package: future