3. ALGORITMOS
set.seed(1) # if using R 3.5 or earlier
set.seed(1, sample.kind = "Rounding") # if using R 3.6 or later
## Warning in set.seed(1, sample.kind = "Rounding"): non-uniform 'Rounding'
## sampler used
test_index <- createDataPartition(brca$y, times = 1, p = 0.2, list = FALSE)
test_x <- x_scaled[test_index,]
test_y <- brca$y[test_index]
train_x <- x_scaled[-test_index,]
train_y <- brca$y[-test_index]
dim(train_x)
## [1] 454 30
dim(train_y)
## NULL
mean(train_y == "B")
## [1] 0.628
mean(test_y == "B")
## [1] 0.626
#CLUSTER K MEANS
predict_kmeans <- function(x, k) {
centers <- k$centers # extract cluster centers
# calculate distance to cluster centers
distances <- sapply(1:nrow(x), function(i){
apply(centers, 1, function(y) dist(rbind(x[i,], y)))
})
max.col(-t(distances)) # select cluster with min distance to center
}
set.seed(3) # if using R 3.5 or earlier
set.seed(3, sample.kind = "Rounding") # if using R 3.6 or later
## Warning in set.seed(3, sample.kind = "Rounding"): non-uniform 'Rounding'
## sampler used
k <- kmeans(train_x, centers = 2)
kmeans_preds <- ifelse(predict_kmeans(test_x, k) == 1, "B", "M")%>%
factor(levels = levels(test_y))
y=mean(kmeans_preds == test_y)
confusionMatrix(data=kmeans_preds, reference=test_y)
## Confusion Matrix and Statistics
##
## Reference
## Prediction B M
## B 71 8
## M 1 35
##
## Accuracy : 0.922
## 95% CI : (0.857, 0.964)
## No Information Rate : 0.626
## P-Value [Acc > NIR] : 3.24e-13
##
## Kappa : 0.827
##
## Mcnemar's Test P-Value : 0.0455
##
## Sensitivity : 0.986
## Specificity : 0.814
## Pos Pred Value : 0.899
## Neg Pred Value : 0.972
## Prevalence : 0.626
## Detection Rate : 0.617
## Detection Prevalence : 0.687
## Balanced Accuracy : 0.900
##
## 'Positive' Class : B
##
k$size
## [1] 295 159
#LOGISTIC REGRESSION
ds=data.frame(y=(train_y),train_x)
dst=data.frame(y=(test_y),test_x)
train_glm <- train(y ~ ., method = "glm", data = ds)
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
glm_preds <- predict(train_glm, dst)%>%
factor(levels = levels(dst$y))
confusionMatrix(data=glm_preds,reference= dst$y)
## Confusion Matrix and Statistics
##
## Reference
## Prediction B M
## B 68 1
## M 4 42
##
## Accuracy : 0.957
## 95% CI : (0.901, 0.986)
## No Information Rate : 0.626
## P-Value [Acc > NIR] : <2e-16
##
## Kappa : 0.908
##
## Mcnemar's Test P-Value : 0.371
##
## Sensitivity : 0.944
## Specificity : 0.977
## Pos Pred Value : 0.986
## Neg Pred Value : 0.913
## Prevalence : 0.626
## Detection Rate : 0.591
## Detection Prevalence : 0.600
## Balanced Accuracy : 0.961
##
## 'Positive' Class : B
##
#LDA AND QDA
ds=data.frame(y=(train_y),train_x)
dst=data.frame(y=(test_y),test_x)
train_glm <- train(y ~ ., method = "lda", data = ds)
lda_preds <- predict(train_glm, dst)%>%
factor(levels = levels(dst$y))
confusionMatrix(data=lda_preds,reference= dst$y)
## Confusion Matrix and Statistics
##
## Reference
## Prediction B M
## B 72 1
## M 0 42
##
## Accuracy : 0.991
## 95% CI : (0.953, 1)
## No Information Rate : 0.626
## P-Value [Acc > NIR] : <2e-16
##
## Kappa : 0.981
##
## Mcnemar's Test P-Value : 1
##
## Sensitivity : 1.000
## Specificity : 0.977
## Pos Pred Value : 0.986
## Neg Pred Value : 1.000
## Prevalence : 0.626
## Detection Rate : 0.626
## Detection Prevalence : 0.635
## Balanced Accuracy : 0.988
##
## 'Positive' Class : B
##
ds=data.frame(y=(train_y),train_x)
dst=data.frame(y=(test_y),test_x)
train_glm <- train(y ~ ., method = "qda", data = ds)
qda_preds <- predict(train_glm, dst)%>%
factor(levels = levels(dst$y))
confusionMatrix(data=qda_preds,reference= dst$y)
## Confusion Matrix and Statistics
##
## Reference
## Prediction B M
## B 70 3
## M 2 40
##
## Accuracy : 0.957
## 95% CI : (0.901, 0.986)
## No Information Rate : 0.626
## P-Value [Acc > NIR] : <2e-16
##
## Kappa : 0.907
##
## Mcnemar's Test P-Value : 1
##
## Sensitivity : 0.972
## Specificity : 0.930
## Pos Pred Value : 0.959
## Neg Pred Value : 0.952
## Prevalence : 0.626
## Detection Rate : 0.609
## Detection Prevalence : 0.635
## Balanced Accuracy : 0.951
##
## 'Positive' Class : B
##
#LOESS
ds=data.frame(y=(train_y),train_x)
dst=data.frame(y=(test_y),test_x)
train_glm <- train(y ~ ., method = "gamLoess", data = ds)
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.0816
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.0683
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 2.9884
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 2.5866
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 3.3913
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 2.5866
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 3.9519
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 2.5866
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 3.7679
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 2.5866
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval -1.7254
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.5959
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval 4.0906
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.5117
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.0279
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.8554
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval 4.7667
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 2.9226
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -3.1093
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.3062
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval 3.2807
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 2.9226
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval 3.0887
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 2.9226
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval 3.4371
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 2.9226
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval 6.0407
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.6782
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval 4.5638
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.3023
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval 4.6672
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.3023
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval 4.9066
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.3023
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval -1.8183
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.8089
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval 7.0657
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.9823
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval -1.6919
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.5952
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval 3.6318
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.4036
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval 4.2836
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.4036
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : eval 4.9307
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : upperlimit 3.6056
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : eval 6.8408
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : upperlimit 3.6056
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.9245
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.6033
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.6693
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.6033
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval 3.89
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : upperlimit 3.3169
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval 5.1084
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : upperlimit 3.3169
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval 4.312
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : upperlimit 3.3169
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval 4.3451
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : upperlimit 3.3169
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## eval -1.4532
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.4098
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval -1.9828
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.8392
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval 4.5644
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.9476
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : eval 11.032
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : upperlimit 10.724
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 4.9056
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.5957
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 5.4251
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.5957
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval -1.4568
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.4337
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.2545
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.2442
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval 6.1381
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.5474
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval -1.2213
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.1802
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval 4.4812
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.1281
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval 4.1335
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.1281
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval 5.925
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.1281
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.9678
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.801
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval 4.7667
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.3126
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval 3.4371
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.3126
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval -1.3311
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.2818
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval -1.5315
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.2818
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval -2.1591
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.0587
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## eval 6.6438
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.7499
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval 3.8825
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.5238
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 9.0077
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.054
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 12.062
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.054
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## eval 9.4537
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 7.8509
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : eval -1.591
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : lowerlimit -1.5364
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : eval -1.6004
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : lowerlimit -1.5364
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : eval -1.5888
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : lowerlimit -1.5364
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.9245
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.694
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## eval 4.6965
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.0184
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval 3.9726
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.9362
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 8.8991
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 7.7674
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval 6.1381
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.5476
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## eval 9.8429
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## upperlimit 7.2466
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 5.4251
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.9374
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval 4.0906
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.5146
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval 4.7667
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.4698
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval -1.9692
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.9679
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.2273
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.9679
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.0715
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.9679
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval 4.6478
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.4026
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval 4.9066
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.6997
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## eval 6.6438
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.7499
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval 6.0407
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.1356
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval 4.6442
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.1356
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval 4.2836
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.6585
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 9.0077
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.054
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 12.062
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.054
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval -2.222
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.1757
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval 5.1084
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : upperlimit 4.3403
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval 4.3451
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : upperlimit 4.3403
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## eval 4.6965
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.3238
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## eval 3.9919
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.3238
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : eval 4.9307
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : upperlimit 3.6056
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : eval 6.8408
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : upperlimit 3.6056
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : eval 11.032
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : upperlimit 10.724
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## eval 9.8429
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## upperlimit 7.2466
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval 5.925
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.5097
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.0816
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.0753
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval -1.7254
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.5989
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.0279
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.8554
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval 3.8825
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.2377
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval 3.4953
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.2377
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval -1.6919
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.5997
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval -1.8183
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.812
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : eval 6.8408
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : upperlimit 4.9633
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.9245
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.694
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval -1.9828
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.8417
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 5.4251
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.9371
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval -1.4568
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.4354
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval 5.1084
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : upperlimit 4.3735
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## eval -1.4532
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.4098
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## eval 4.6965
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.3238
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## eval 3.9919
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.3238
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval -1.2213
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.1893
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.9678
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.801
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -2.2803
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.2105
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -3.1093
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.2105
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## eval 4.4052
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 3.1233
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## eval 4.262
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 3.1233
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## eval 3.4499
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 3.1233
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval -1.8183
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.812
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval 3.9726
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.9362
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 8.8991
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 7.7674
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## eval 9.4537
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 7.8509
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 3.7665
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.461
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 4.5658
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.461
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 4.9056
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.461
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 5.4251
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.461
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval -1.4568
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.428
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.9245
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.694
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval 4.4808
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.0229
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.9678
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.801
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval 4.6478
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.404
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## eval 4.4052
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.2911
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval 3.9726
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.9362
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## eval 4.2348
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.0649
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## eval 4.2399
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.0649
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.9245
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.694
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 8.8991
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 7.7674
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## eval 9.4537
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 7.8509
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 5.4251
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.9374
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval 4.4808
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.0229
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -3.1093
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.3155
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.2273
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.0985
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.376
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.3448
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval 4.6478
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.3448
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval -1.5315
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.3731
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval -1.8183
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.7836
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval -2.1591
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.0652
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.9245
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.694
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval -2.222
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.1757
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval 6.1381
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.5476
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 5.4251
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.9371
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval -1.4568
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.4354
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -2.2803
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.2038
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval 4.7667
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.4652
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -3.1093
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.2038
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval 4.4808
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.0229
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval 4.0906
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.5146
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.6181
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.4702
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.6835
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.4702
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.6729
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.4702
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.9678
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.744
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.772
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.744
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval 4.2721
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.8524
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval 4.5638
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.8524
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval 4.6672
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.8524
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval 4.9066
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.8524
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval -1.8183
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.7782
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 12.062
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 9.058
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval 6.0407
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.6782
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## eval 6.6438
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## upperlimit 3.499
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## eval 3.7395
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## upperlimit 3.499
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## eval 4.7168
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## upperlimit 3.499
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## eval 3.665
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## upperlimit 3.499
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 8.8991
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.0056
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 7.7235
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.0056
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval 3.9726
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.7377
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval 3.9068
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.7377
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval 4.2836
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.6585
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## eval 4.0576
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.6109
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## eval 9.4537
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.6109
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## eval 7.8067
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.6109
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval -1.341
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : lowerlimit -1.3333
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## eval 5.2402
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.5626
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## eval 5.2459
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.5626
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : eval 10.667
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : upperlimit 4.26
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : eval 11.032
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : upperlimit 4.26
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval -1.4692
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.4154
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval -1.4739
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.4154
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## eval 9.8429
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## upperlimit 7.2466
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval 5.925
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.5097
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval -2.1591
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.0587
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval 4.6478
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.404
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.9678
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.801
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.2941
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.2699
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.6181
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.2699
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.6835
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.2699
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.3458
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.2699
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.6729
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.2699
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.4142
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.2699
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.4492
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.2699
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval 3.8825
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.5238
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : eval -1.4947
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : lowerlimit -1.4418
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : eval -1.591
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : lowerlimit -1.4418
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : eval -1.6004
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : lowerlimit -1.4418
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : eval -1.5888
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : lowerlimit -1.4418
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : eval -1.4714
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : lowerlimit -1.4418
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval -1.8183
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.812
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval -1.5315
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.3731
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## eval 4.2348
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.0649
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## eval 4.2399
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.0649
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 8.8991
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 7.7674
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval 3.9726
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.9362
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## eval 9.4537
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 7.8509
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.4941
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.1138
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.4374
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.1138
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.9245
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.1138
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.5791
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.1138
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.6693
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.1138
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 4.5658
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.7926
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 4.9056
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.7926
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 5.4251
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.7926
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.2545
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.2523
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval -1.848
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.7623
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.1763
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.7623
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.1581
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.7623
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 3.9519
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.7972
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval 4.0906
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.5146
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## eval 6.6438
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.7499
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.2545
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.2442
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval 6.1381
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.5474
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval 3.8825
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.5238
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 9.0077
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.054
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 12.062
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.054
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : eval 11.032
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : upperlimit 10.724
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval 4.2836
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.6585
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## eval 4.6965
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.0184
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval 5.925
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.5097
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## eval 9.8429
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## upperlimit 7.2466
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.0453
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.9832
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.0816
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.9832
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 3.9519
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.7966
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval -1.848
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.7623
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.1763
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.7623
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.1581
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.7623
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval 4.7667
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.4698
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.0279
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.8445
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval -1.7254
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.5129
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval -1.5139
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.5129
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval -1.5706
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.5129
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval 4.0906
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.5113
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval 4.9066
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.6995
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval -1.8183
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.8108
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval -1.3311
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.2875
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval 4.9499
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.3512
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval 4.7285
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.3512
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval -1.5315
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.2875
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval 7.0657
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.3512
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval 6.0407
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.6775
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval -2.1591
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.0582
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval 4.6478
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.404
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval 3.8825
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.5238
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval -1.6919
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.515
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval -1.5705
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.515
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval 3.6318
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.4032
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval 4.2836
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.4032
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## eval 4.6965
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.0184
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : eval 11.032
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : upperlimit 10.724
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval -1.9828
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.8417
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval 4.5644
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.9476
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.2155
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.199
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.2545
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.199
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval -1.4568
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.438
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## eval -1.4532
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.3858
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval -1.2213
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.139
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval -1.1539
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.139
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval 5.925
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.5092
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 3.9519
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.7972
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.0279
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.8554
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval -2.1591
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.0652
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval -1.7254
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.5989
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -2.2803
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.2105
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -3.1093
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.2105
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.2273
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.1051
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.6181
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.4702
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.6835
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.4702
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.6729
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.4702
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval -1.3311
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.3235
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval -1.5315
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.3235
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval -2.1456
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.9125
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval -2.222
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.9125
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval -1.6919
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.5997
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## eval 4.2348
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.0649
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## eval 4.2399
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.0649
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## eval 4.6965
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.0184
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval -1.9828
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.8243
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 5.4251
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.9374
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.9245
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.694
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval 4.5187
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## upperlimit 3.9561
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval 4.053
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## upperlimit 3.9561
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval 6.1381
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## upperlimit 3.9561
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## eval -1.4532
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.4098
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval -1.2213
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.1893
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.0453
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.963
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.0816
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.963
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.0279
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.8554
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval -1.7254
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.5989
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -2.2803
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.2105
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -3.1093
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.2105
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## eval 4.4052
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.2911
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## eval 6.6438
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.7499
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval -1.6919
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.5997
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.2155
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.1867
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval 4.5187
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.0791
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.2545
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.1867
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval 6.1381
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.0791
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval -1.9828
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.8392
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## eval -1.4532
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.4098
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 12.062
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 9.058
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval -1.2213
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.1893
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## eval 9.8429
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## upperlimit 6.8933
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## eval 7.2051
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## upperlimit 6.8933
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 3.9519
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.4187
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 3.7679
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.4187
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -2.2803
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.2038
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval 4.7667
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.4652
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -3.1093
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.2038
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval 4.0906
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.5146
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval -1.5315
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.3731
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval -2.1591
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.0652
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.2273
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.0023
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.0715
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.0023
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.6835
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.6399
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.6729
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.6399
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval 4.2836
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.6585
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval -2.1456
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.9125
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval -2.222
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.9125
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.2155
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.1971
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.2545
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.1971
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : eval 11.032
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : upperlimit 10.724
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval -1.4568
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.4339
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval 4.4812
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.1602
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval 5.925
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.1602
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.1763
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.8742
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.1581
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.8742
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval 4.4808
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.4237
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.992
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.4237
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -3.1093
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.3155
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval -2.1591
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.0652
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## eval 6.6438
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.7499
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval -1.8183
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.812
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval -1.3311
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.3118
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval 4.9499
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.7586
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval -1.5315
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.3118
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval 7.0657
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.7586
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.2545
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.2523
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 12.062
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 9.058
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval 4.5644
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.4776
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval 3.9206
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.4776
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## eval 9.8429
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## upperlimit 6.8933
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## eval 7.2051
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## upperlimit 6.8933
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.0816
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.0725
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 3.9519
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.4185
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 3.7679
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.4185
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval 4.4808
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.0229
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.2273
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.0987
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval 4.6478
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.4033
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval -2.222
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.1738
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval 3.8825
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.5235
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval -1.341
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : lowerlimit -1.3333
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## eval 4.2348
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.0649
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## eval 4.2399
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.0649
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 5.4251
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.9374
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.9245
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.6033
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.6693
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.6033
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval 6.1381
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.5476
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.0453
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.9841
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.0816
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.9841
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.3974
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.187
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval 4.4808
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.187
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.992
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.187
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -2.2803
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.2105
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -3.1093
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.2105
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.9678
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.801
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.6835
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.6399
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : eval 2.6729
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : upperlimit 2.6399
## Warning in gam.lo(data[["lo(concave_pts_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.2273
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.0023
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.0715
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.0023
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval 7.0657
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.9823
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval -2.222
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.1757
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval 4.5644
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.9476
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval 3.9726
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.9362
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## eval 9.4537
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 7.8509
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 8.8991
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 7.7674
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval 6.1381
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.5476
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval -1.4568
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.438
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 3.9519
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.7972
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.9678
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.744
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.772
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.744
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval 4.0906
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.5146
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.2273
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.1051
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -3.1093
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.3155
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval 4.9499
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.7598
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval 7.0657
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.7598
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval -2.1456
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.9105
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval -2.222
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.9105
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval 3.8825
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.5222
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval 4.2836
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.6585
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval 3.9726
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.7377
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval 3.9068
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.7377
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval -1.8183
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.812
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 3.9804
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 3.5019
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 8.8991
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 3.5019
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 7.7235
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 3.5019
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.9245
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.694
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval 4.5644
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.9476
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## eval 9.4537
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.0831
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## eval 7.8067
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.0831
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : eval 4.2352
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : upperlimit 3.5243
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : eval 10.667
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : upperlimit 3.5243
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : eval 4.0395
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : upperlimit 3.5243
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : eval 11.032
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : upperlimit 3.5243
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## eval 5.2402
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.5626
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## eval 5.2459
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.5626
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval 5.925
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.5097
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 4.5658
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.7926
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 4.9056
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.7926
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 5.4251
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.7926
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval -1.7254
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.5959
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval 4.0906
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.5138
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.0279
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.8541
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.9678
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.743
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.772
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.743
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.1763
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.8797
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.1581
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.8797
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval 7.0657
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.9823
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.2273
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.1051
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## eval 4.6965
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.04
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## eval 3.9919
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.04
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## eval 3.3007
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.04
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval -1.6919
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.5965
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval 4.2836
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.6578
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval -2.222
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.1757
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval -1.9828
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.8404
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval 3.9726
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.7369
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval 3.9068
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.7369
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : eval 6.8408
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : upperlimit 4.9633
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## eval -1.4532
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.4063
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## eval 5.2402
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.5622
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## eval 5.2459
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.5622
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : eval 10.667
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : upperlimit 4.26
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : eval 11.032
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : upperlimit 4.26
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval -1.4692
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.4099
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval -1.4739
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.4099
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval 4.5644
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.4771
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval 3.9206
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.4771
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## eval 9.4537
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.0831
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## eval 7.8067
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.0831
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval -1.2213
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.1803
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval 4.4812
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.1599
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval 5.925
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.1599
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval -1.3225
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : lowerlimit -1.3181
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval -1.341
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : lowerlimit -1.3181
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval 5.1084
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : upperlimit 4.3732
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 8.8991
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.0056
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 7.7235
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.0056
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.2155
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.199
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.2545
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.199
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval 4.7667
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.3126
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval 3.4371
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.3126
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval 4.6478
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.404
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval 7.0657
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.9823
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## eval -1.5482
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.5337
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## eval -1.5495
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.5337
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## eval 6.6438
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.7499
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.9245
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.694
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 9.0077
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.054
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 12.062
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.054
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## eval 4.6965
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.0184
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval 4.5644
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.4243
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval 3.4529
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.4243
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval 3.9206
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.4243
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.2545
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.2442
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval 6.1381
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.5474
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 5.4251
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.9374
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## eval 9.8429
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## upperlimit 7.2466
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.0453
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.9621
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.0816
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.9621
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 3.9519
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.7965
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.9678
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.801
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.2273
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.1051
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## eval 6.6438
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.7499
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval 4.9066
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.6997
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval 3.9726
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.9362
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval -2.222
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.1757
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval 6.0407
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.6782
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 8.8991
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 7.7674
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## eval 4.6965
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.0184
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## eval 9.4537
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 7.8509
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval -1.4692
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.4154
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval -1.4739
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.4154
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 9.0077
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.1983
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 3.6973
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.1983
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 12.062
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.1983
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 4.0286
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.1983
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval -1.4568
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.438
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.2155
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.199
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.2545
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.199
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## eval 9.8429
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## upperlimit 7.2465
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.0453
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.9832
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.0816
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.9832
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 3.9519
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.7966
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval 6.0407
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.6782
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## eval 4.2348
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.0649
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## eval 4.2399
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.0649
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval 4.6672
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.5958
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval 4.9066
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.5958
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## eval 4.4052
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.2911
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## eval 4.6965
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.0184
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.9245
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.694
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 4.9056
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.5957
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 5.4251
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.5957
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval -1.4568
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.4296
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.0816
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.0683
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 2.9884
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 2.5866
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 3.3913
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 2.5866
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 3.9519
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 2.5866
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval 3.7679
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## upperlimit 2.5866
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval 4.4808
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.0229
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval -1.7254
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.542
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval -1.5706
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.542
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.0279
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.8445
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -3.1093
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.3155
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval 4.6672
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.5958
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval 4.9066
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## upperlimit 4.5958
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval 6.0407
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.135
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval -2.1591
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.0555
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval 4.6442
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.135
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## eval 6.6438
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## upperlimit 4.7499
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval -1.5315
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.3731
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval -1.9828
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.8392
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.9245
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.5179
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.5791
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.5179
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.6693
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.5179
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 9.0077
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 2.8255
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 3.6973
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 2.8255
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 12.062
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 2.8255
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 2.9088
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 2.8255
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 4.0286
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 2.8255
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 3.1772
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 2.8255
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval -1.341
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : lowerlimit -1.3333
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval -1.6919
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.5351
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval -1.5705
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.5351
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## eval 4.6965
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.0184
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## eval 4.0392
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.6186
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## eval 4.2348
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.6186
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## eval 4.2399
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.6186
## Warning in gam.lo(data[["lo(concavity_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## eval -1.4532
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.3858
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 4.9056
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.596
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 5.4251
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.596
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval -1.2213
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.1602
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## eval 6.8536
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## upperlimit 3.4409
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## eval 3.4712
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## upperlimit 3.4409
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## eval 9.8429
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## upperlimit 3.4409
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## eval 5.3381
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## upperlimit 3.4409
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## eval 7.2051
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## upperlimit 3.4409
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.0816
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.0753
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval 4.4808
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.0229
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval 4.0906
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.5146
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.9678
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.744
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval 3.772
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.744
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -3.1093
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.3155
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval -1.5315
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.3731
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## eval 6.6438
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## upperlimit 3.7678
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## eval 4.7168
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## upperlimit 3.7678
## Warning in gam.lo(data[["lo(concave_pts_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## eval -2.1591
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.0587
## Warning in gam.lo(data[["lo(symmetry_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval 4.2836
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## upperlimit 3.6585
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval 3.8825
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.2377
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval 3.4953
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.2377
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval 5.1084
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : upperlimit 4.3403
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval 4.3451
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : upperlimit 4.3403
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : eval 4.2352
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : upperlimit 4.0634
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : eval 10.667
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : upperlimit 4.0634
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : eval 11.032
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : upperlimit 4.0634
## Warning in gam.lo(data[["lo(area_se, span = 0.5, degree = 1)"]], z, w, span
## = 0.5, : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## eval 12.062
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 9.058
## Warning in gam.lo(data[["lo(concavity_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : eval 6.8408
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : upperlimit 4.9633
## Warning in gam.lo(data[["lo(fractal_dim_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval 3.9726
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.7377
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval 3.9068
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.7377
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## eval 5.2402
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.5626
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## eval 5.2459
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.5626
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## eval 3.9245
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.694
## Warning in gam.lo(data[["lo(concave_pts_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 3.9804
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 3.2192
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 8.8991
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 3.2192
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 3.4792
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 3.2192
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## eval 7.7235
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 3.2192
## Warning in gam.lo(data[["lo(radius_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## eval 4.0576
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.6109
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## eval 9.4537
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.6109
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## eval 7.8067
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.6109
## Warning in gam.lo(data[["lo(perimeter_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## eval 9.8429
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## upperlimit 7.2466
## Warning in gam.lo(data[["lo(fractal_dim_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 5.4251
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.9374
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval 4.4812
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.1602
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval 5.925
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.1602
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.0816
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.0753
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## eval -1.7254
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.5989
## Warning in gam.lo(data[["lo(radius_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.0279
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.8554
## Warning in gam.lo(data[["lo(radius_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## eval 4.6478
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.404
## Warning in gam.lo(data[["lo(texture_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval 4.7667
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.4657
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## eval -3.1093
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -2.3089
## Warning in gam.lo(data[["lo(smoothness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## eval -1.8183
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.7836
## Warning in gam.lo(data[["lo(fractal_dim_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## eval 7.0657
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 4.9823
## Warning in gam.lo(data[["lo(symmetry_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## eval -1.6919
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -1.5997
## Warning in gam.lo(data[["lo(perimeter_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## eval 4.4052
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 3.4749
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## eval 4.262
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 3.4749
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## eval 3.8825
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## upperlimit 3.5238
## Warning in gam.lo(data[["lo(texture_worst, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## eval -1.4532
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.4098
## Warning in gam.lo(data[["lo(area_mean, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## eval -1.9828
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.8392
## Warning in gam.lo(data[["lo(perimeter_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## eval 4.6965
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## upperlimit 4.0184
## Warning in gam.lo(data[["lo(concavity_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval 4.5644
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.4775
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval 3.9206
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## upperlimit 3.4775
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.2545
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.2523
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## eval -1.2213
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## lowerlimit -1.1893
## Warning in gam.lo(data[["lo(area_worst, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in model.matrix.default(mt, mf, contrasts): non-list contrasts
## argument ignored
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
## Warning in lo.wam(x, z, wz, fit$smooth, which, fit$smooth.frame,
## bf.maxit, : lo.wam convergence not obtained in 30 iterations
loess_preds <- predict(train_glm, dst)%>%
factor(levels = levels(dst$y))
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.2389
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.1118
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.6803
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.1118
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## eval -2.1145
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## lowerlimit -2.1118
## Warning in gam.lo(data[["lo(smoothness_worst, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.3514
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.2096
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.2201
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.2096
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## eval -2.7417
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## lowerlimit -2.2096
## Warning in gam.lo(data[["lo(symmetry_mean, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## eval 6.6494
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.435
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## eval 4.8566
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## upperlimit 4.435
## Warning in gam.lo(data[["lo(texture_se, span = 0.5, degree = 1)"]], z, w, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval -1.3979
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : lowerlimit -1.3733
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : eval -1.4426
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : lowerlimit -1.3733
## Warning in gam.lo(data[["lo(compactness_worst, span = 0.5, degree =
## 1)"]], : extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval -1.6087
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.5041
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## eval -1.5318
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## lowerlimit -1.5041
## Warning in gam.lo(data[["lo(compactness_mean, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## eval -1.297
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## lowerlimit -1.2915
## Warning in gam.lo(data[["lo(compactness_se, span = 0.5, degree = 1)"]], :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval -1.7745
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## lowerlimit -1.4912
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## eval 8.0229
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## upperlimit 5.4595
## Warning in gam.lo(data[["lo(smoothness_se, span = 0.5, degree = 1)"]], z, :
## extrapolation not allowed with blending
confusionMatrix(data=loess_preds,reference= dst$y)
## Confusion Matrix and Statistics
##
## Reference
## Prediction B M
## B 71 1
## M 1 42
##
## Accuracy : 0.983
## 95% CI : (0.939, 0.998)
## No Information Rate : 0.626
## P-Value [Acc > NIR] : <2e-16
##
## Kappa : 0.963
##
## Mcnemar's Test P-Value : 1
##
## Sensitivity : 0.986
## Specificity : 0.977
## Pos Pred Value : 0.986
## Neg Pred Value : 0.977
## Prevalence : 0.626
## Detection Rate : 0.617
## Detection Prevalence : 0.626
## Balanced Accuracy : 0.981
##
## 'Positive' Class : B
##
#KNN
set.seed(7)
ds=data.frame(y=(train_y),train_x)
dst=data.frame(y=(test_y),test_x)
train_glm <- train(y ~ ., method = "knn", tuneGrid = data.frame(k = seq(3, 21, 2)), data = ds)
knn_preds <- predict(train_glm, dst)%>%
factor(levels = levels(dst$y))
confusionMatrix(data=knn_preds,reference= dst$y)
## Confusion Matrix and Statistics
##
## Reference
## Prediction B M
## B 72 6
## M 0 37
##
## Accuracy : 0.948
## 95% CI : (0.89, 0.981)
## No Information Rate : 0.626
## P-Value [Acc > NIR] : 5.75e-16
##
## Kappa : 0.885
##
## Mcnemar's Test P-Value : 0.0412
##
## Sensitivity : 1.000
## Specificity : 0.860
## Pos Pred Value : 0.923
## Neg Pred Value : 1.000
## Prevalence : 0.626
## Detection Rate : 0.626
## Detection Prevalence : 0.678
## Balanced Accuracy : 0.930
##
## 'Positive' Class : B
##
train_glm$bestTune
## k
## 10 21
#RANDOM FOREST
set.seed(9)
ds=data.frame(y=(train_y),train_x)
dst=data.frame(y=(test_y),test_x)
fit <- with(ds,
train(y ~ ., method = "rf",
data = ds,
tuneGrid = data.frame(mtry = c(3,5,7,9)),
importance=TRUE))
rf_preds=predict(fit, dst)
confusionMatrix(data=rf_preds, reference=dst$y)
## Confusion Matrix and Statistics
##
## Reference
## Prediction B M
## B 72 3
## M 0 40
##
## Accuracy : 0.974
## 95% CI : (0.926, 0.995)
## No Information Rate : 0.626
## P-Value [Acc > NIR] : <2e-16
##
## Kappa : 0.943
##
## Mcnemar's Test P-Value : 0.248
##
## Sensitivity : 1.000
## Specificity : 0.930
## Pos Pred Value : 0.960
## Neg Pred Value : 1.000
## Prevalence : 0.626
## Detection Rate : 0.626
## Detection Prevalence : 0.652
## Balanced Accuracy : 0.965
##
## 'Positive' Class : B
##
ggplot(fit)

imp <- varImp(fit)
imp
## rf variable importance
##
## only 20 most important variables shown (out of 30)
##
## Importance
## area_worst 100.0
## radius_worst 87.7
## concave_pts_worst 85.7
## perimeter_worst 85.5
## concave_pts_mean 72.1
## area_se 67.3
## concavity_worst 63.5
## area_mean 61.4
## texture_worst 59.9
## perimeter_mean 55.2
## concavity_mean 55.2
## texture_mean 55.0
## radius_se 49.8
## smoothness_worst 49.1
## radius_mean 49.0
## perimeter_se 45.0
## compactness_worst 39.3
## symmetry_worst 35.3
## smoothness_mean 30.6
## fractal_dim_worst 27.8
#ENSEMBLE
ensemble <- cbind(glm = glm_preds == "B", lda = lda_preds == "B", qda = qda_preds == "B", loess = loess_preds == "B", rf = rf_preds == "B", knn = knn_preds == "B", kmeans = kmeans_preds == "B")
ensemble_preds <- ifelse(rowMeans(ensemble) > 0.5, "B", "M")
mean(ensemble_preds == test_y)
## [1] 0.983
models <- c("K means", "Logistic regression", "LDA", "QDA", "Loess", "K nearest neighbors", "Random forest", "Ensemble")
accuracy <- c(mean(kmeans_preds == test_y),
mean(glm_preds == test_y),
mean(lda_preds == test_y),
mean(qda_preds == test_y),
mean(loess_preds == test_y),
mean(knn_preds == test_y),
mean(rf_preds == test_y),
mean(ensemble_preds == test_y))
data.frame(Model = models, Accuracy = accuracy)
## Model Accuracy
## 1 K means 0.922
## 2 Logistic regression 0.957
## 3 LDA 0.991
## 4 QDA 0.957
## 5 Loess 0.983
## 6 K nearest neighbors 0.948
## 7 Random forest 0.974
## 8 Ensemble 0.983