Creating ploting functions

point_plot <- function(pred_qual){
  ggplot(wine_test, aes(quality, pred_qual)) +
  geom_point() +
  xlab('Observed Quality') +
  ylab('Predicted Quality') +
  stat_smooth(method = lm) +
  xlim(3, 8) +
  ylim(3, 8)
}

box_plot <- function(pred_qual){
  box_glm <- ggplot(wine_test, aes(quality, pred_qual)) +
  geom_boxplot(aes(group = cut_width(quality, 1))) +
  xlab('Observed Quality') +
  ylab('Predicted Quality') +
  xlim(3, 8) +
  ylim(3, 8)
}

Comparing machine learning methods using the Caret R Package for a red wine quality model

### Getting and exploring the data

library(readr)
library(tidyverse)

wine <- read_delim('winequality-red.csv',
                                ';',
                                escape_double = FALSE,
                                trim_ws = TRUE)

ggplot(wine, aes(quality)) +
  geom_histogram(bins = 30)

wine_train <- wine[1:1000, ]
wine_test <- wine[1001:1599, ]

Running a Generalized Linear Model

library(caret)
## Loading required package: lattice
## 
## Attaching package: 'caret'
## The following object is masked from 'package:purrr':
## 
##     lift
m_glm <- train(quality ~ .,
                   data = wine_train,
                   method = 'glm',
                   preProcess = c('scale', 'center'),
                   trControl = trainControl(method = 'repeatedcv', 
                                            number = 10, 
                                            repeats = 5, 
                                            verboseIter = FALSE))
m_glm
## Generalized Linear Model 
## 
## 1000 samples
##   11 predictor
## 
## Pre-processing: scaled (11), centered (11) 
## Resampling: Cross-Validated (10 fold, repeated 5 times) 
## Summary of sample sizes: 899, 900, 901, 900, 901, 901, ... 
## Resampling results:
## 
##   RMSE       Rsquared   MAE      
##   0.6496347  0.3437403  0.5053065
summary(m_glm)
## 
## Call:
## NULL
## 
## Deviance Residuals: 
##      Min        1Q    Median        3Q       Max  
## -2.66538  -0.37685  -0.05997   0.44355   2.04870  
## 
## Coefficients:
##                              Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                   5.59400    0.02042 273.891  < 2e-16 ***
## `\\`fixed acidity\\``         0.06614    0.05922   1.117  0.26432    
## `\\`volatile acidity\\``     -0.17773    0.02647  -6.715 3.18e-11 ***
## `\\`citric acid\\``          -0.04047    0.03627  -1.116  0.26472    
## `\\`residual sugar\\``        0.03723    0.02618   1.422  0.15533    
## chlorides                    -0.07154    0.02495  -2.867  0.00423 ** 
## `\\`free sulfur dioxide\\``   0.03191    0.02957   1.079  0.28075    
## `\\`total sulfur dioxide\\`` -0.14090    0.03168  -4.448 9.64e-06 ***
## density                      -0.05291    0.04733  -1.118  0.26387    
## pH                           -0.02823    0.03758  -0.751  0.45265    
## sulphates                     0.13067    0.02426   5.386 9.02e-08 ***
## alcohol                       0.28949    0.03279   8.829  < 2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for gaussian family taken to be 0.4171482)
## 
##     Null deviance: 637.16  on 999  degrees of freedom
## Residual deviance: 412.14  on 988  degrees of freedom
## AIC: 1977.5
## 
## Number of Fisher Scoring iterations: 2
wine_test$pred_qual_glm <- predict(m_glm, wine_test)

cor_glm <- cor(wine_test$quality, wine_test$pred_qual_glm)
mae_glm <- mean(abs(wine_test$quality - wine_test$pred_qual_glm))

point_glm <- point_plot(wine_test$pred_qual_glm) +
  ggtitle('GLM')
box_glm <- box_plot(wine_test$pred_qual_glm) +
  ggtitle('GLM')

cor_glm
## [1] 0.5894671
mae_glm
## [1] 0.5080479
point_glm
## `geom_smooth()` using formula 'y ~ x'

box_glm
## Warning: Removed 1 rows containing missing values (geom_segment).

## Warning: Removed 1 rows containing missing values (geom_segment).

Running a Bayesian Generalized Linear Model

m_bglm <- train(quality ~ .,
                   data = wine_train,
                   method = 'bayesglm',
                   preProcess = c('scale', 'center'),
                   trControl = trainControl(method = 'repeatedcv', 
                                            number = 10, 
                                            repeats = 5, 
                                            verboseIter = FALSE))
m_bglm
## Bayesian Generalized Linear Model 
## 
## 1000 samples
##   11 predictor
## 
## Pre-processing: scaled (11), centered (11) 
## Resampling: Cross-Validated (10 fold, repeated 5 times) 
## Summary of sample sizes: 900, 899, 900, 899, 901, 900, ... 
## Resampling results:
## 
##   RMSE       Rsquared   MAE      
##   0.6496765  0.3438812  0.5053907
summary(m_bglm)
## 
## Call:
## NULL
## 
## Deviance Residuals: 
##      Min        1Q    Median        3Q       Max  
## -2.66536  -0.37684  -0.05995   0.44358   2.04871  
## 
## Coefficients:
##                              Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                   5.59398    0.02042 273.890  < 2e-16 ***
## `\\`fixed acidity\\``         0.06614    0.05920   1.117  0.26411    
## `\\`volatile acidity\\``     -0.17772    0.02647  -6.715 3.18e-11 ***
## `\\`citric acid\\``          -0.04045    0.03626  -1.115  0.26493    
## `\\`residual sugar\\``        0.03723    0.02617   1.422  0.15523    
## chlorides                    -0.07154    0.02495  -2.867  0.00423 ** 
## `\\`free sulfur dioxide\\``   0.03190    0.02956   1.079  0.28083    
## `\\`total sulfur dioxide\\`` -0.14089    0.03167  -4.449 9.63e-06 ***
## density                      -0.05292    0.04731  -1.119  0.26359    
## pH                           -0.02822    0.03757  -0.751  0.45273    
## sulphates                     0.13067    0.02426   5.386 9.01e-08 ***
## alcohol                       0.28947    0.03278   8.830  < 2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for gaussian family taken to be 0.4171482)
## 
##     Null deviance: 637.16  on 999  degrees of freedom
## Residual deviance: 412.14  on 988  degrees of freedom
## AIC: 1977.5
## 
## Number of Fisher Scoring iterations: 6
wine_test$pred_qual_bglm <- predict(m_bglm, wine_test)

cor_bglm <- cor(wine_test$quality, wine_test$pred_qual_bglm)
mae_bglm <- mean(abs(wine_test$quality - wine_test$pred_qual_bglm))

point_bglm <- point_plot(wine_test$pred_qual_bglm) +
  ggtitle('Bayesian GLM')
box_bglm <- box_plot(wine_test$pred_qual_bglm) +
  ggtitle('Bayesian GLM')

cor_bglm
## [1] 0.5894664
mae_bglm
## [1] 0.5080466
point_bglm
## `geom_smooth()` using formula 'y ~ x'

box_bglm
## Warning: Removed 1 rows containing missing values (geom_segment).

## Warning: Removed 1 rows containing missing values (geom_segment).

Running a Bayesian Lasso Model

library(elasticnet)
## Loading required package: lars
## Loaded lars 1.2
m_lss <- train(quality ~ .,
                   data = wine_train,
                   method = 'lasso',
                   preProcess = c('scale', 'center'),
                   trControl = trainControl(method = 'repeatedcv', 
                                            number = 10, 
                                            repeats = 5, 
                                            verboseIter = FALSE))
                   tuneGrid = expand.grid(fraction = seq(0.5, 0.9, 0.1),
                                          verbose = 0)
m_lss
## The lasso 
## 
## 1000 samples
##   11 predictor
## 
## Pre-processing: scaled (11), centered (11) 
## Resampling: Cross-Validated (10 fold, repeated 5 times) 
## Summary of sample sizes: 900, 900, 899, 901, 900, 900, ... 
## Resampling results across tuning parameters:
## 
##   fraction  RMSE       Rsquared   MAE      
##   0.1       0.7511887  0.2436133  0.6397577
##   0.5       0.6596269  0.3359569  0.5302311
##   0.9       0.6498929  0.3430467  0.5064432
## 
## RMSE was used to select the optimal model using the smallest value.
## The final value used for the model was fraction = 0.9.
summary(m_lss)
##             Length Class      Mode     
## call          4    -none-     call     
## actions      14    -none-     list     
## allset       11    -none-     numeric  
## beta.pure   154    -none-     numeric  
## vn           11    -none-     character
## mu            1    -none-     numeric  
## normx        11    -none-     numeric  
## meanx        11    -none-     numeric  
## lambda        1    -none-     numeric  
## L1norm       14    -none-     numeric  
## penalty      14    -none-     numeric  
## df           14    -none-     numeric  
## Cp           14    -none-     numeric  
## sigma2        1    -none-     numeric  
## xNames       11    -none-     character
## problemType   1    -none-     character
## tuneValue     1    data.frame list     
## obsLevels     1    -none-     logical  
## param         0    -none-     list
wine_test$pred_qual_lss <- predict(m_lss, wine_test)

cor_lss <- cor(wine_test$quality, wine_test$pred_qual_lss)
mae_lss <- mean(abs(wine_test$quality - wine_test$pred_qual_lss))

point_lss <- point_plot(wine_test$pred_qual_lss) +
  ggtitle('Lasso')
box_lss <- box_plot(wine_test$pred_qual_lss) +
  ggtitle('Lasso')

cor_lss
## [1] 0.5882794
mae_lss
## [1] 0.5086242
point_lss
## `geom_smooth()` using formula 'y ~ x'

box_lss
## Warning: Removed 1 rows containing missing values (geom_segment).

## Warning: Removed 1 rows containing missing values (geom_segment).

Running a CUBIST model with hypergrid tuning.

library(Cubist)

m_cube <- train(quality ~ .,
                   data = wine_train,
                   method = 'cubist',
                   preProcess = c('scale', 'center'),
                   trControl = trainControl(method = 'repeatedcv', 
                                            number = 10, 
                                            repeats = 5, 
                                            verboseIter = FALSE),
                   tuneGrid = expand.grid(committees = seq(5, 100, 5),
                                          neighbors = seq(1, 9, 1)),
                                          verbose = 0)
m_cube
## Cubist 
## 
## 1000 samples
##   11 predictor
## 
## Pre-processing: scaled (11), centered (11) 
## Resampling: Cross-Validated (10 fold, repeated 5 times) 
## Summary of sample sizes: 900, 900, 900, 899, 900, 901, ... 
## Resampling results across tuning parameters:
## 
##   committees  neighbors  RMSE       Rsquared   MAE      
##     5         1          0.6947366  0.3710593  0.4260736
##     5         2          0.6498794  0.3899459  0.4490233
##     5         3          0.6390552  0.3929477  0.4581777
##     5         4          0.6303222  0.4001531  0.4610478
##     5         5          0.6282137  0.4002978  0.4649909
##     5         6          0.6287072  0.3973263  0.4667296
##     5         7          0.6286872  0.3958084  0.4675442
##     5         8          0.6280364  0.3958081  0.4678069
##     5         9          0.6264741  0.3977011  0.4676159
##    10         1          0.6920735  0.3733994  0.4257927
##    10         2          0.6479498  0.3920648  0.4484375
##    10         3          0.6371738  0.3953088  0.4574363
##    10         4          0.6285211  0.4025295  0.4607422
##    10         5          0.6265023  0.4024479  0.4647094
##    10         6          0.6268437  0.3997052  0.4663246
##    10         7          0.6266056  0.3986099  0.4670450
##    10         8          0.6258780  0.3988121  0.4673355
##    10         9          0.6242336  0.4009209  0.4672538
##    15         1          0.6904728  0.3746775  0.4242686
##    15         2          0.6466527  0.3933881  0.4471396
##    15         3          0.6359518  0.3967019  0.4561708
##    15         4          0.6274699  0.4038578  0.4596086
##    15         5          0.6255364  0.4036996  0.4637910
##    15         6          0.6259411  0.4008687  0.4654660
##    15         7          0.6257913  0.3996756  0.4662526
##    15         8          0.6251047  0.3998467  0.4665979
##    15         9          0.6234202  0.4020544  0.4664929
##    20         1          0.6888306  0.3763948  0.4235143
##    20         2          0.6454713  0.3949363  0.4467135
##    20         3          0.6347430  0.3984590  0.4557399
##    20         4          0.6261893  0.4057907  0.4591110
##    20         5          0.6241210  0.4058548  0.4630391
##    20         6          0.6244694  0.4031127  0.4647064
##    20         7          0.6242774  0.4019803  0.4656478
##    20         8          0.6235489  0.4022214  0.4661210
##    20         9          0.6218756  0.4044214  0.4660482
##    25         1          0.6887533  0.3767641  0.4235711
##    25         2          0.6452051  0.3953792  0.4466044
##    25         3          0.6345433  0.3987182  0.4555630
##    25         4          0.6259293  0.4061216  0.4588543
##    25         5          0.6237817  0.4062910  0.4628461
##    25         6          0.6240567  0.4036488  0.4645248
##    25         7          0.6238501  0.4025444  0.4655554
##    25         8          0.6230353  0.4029242  0.4658733
##    25         9          0.6213516  0.4051498  0.4658704
##    30         1          0.6886085  0.3769311  0.4238403
##    30         2          0.6450410  0.3954065  0.4468508
##    30         3          0.6343281  0.3988054  0.4556354
##    30         4          0.6256653  0.4063215  0.4589420
##    30         5          0.6235298  0.4064629  0.4628759
##    30         6          0.6238269  0.4037802  0.4644926
##    30         7          0.6236269  0.4026622  0.4655535
##    30         8          0.6228036  0.4030512  0.4658936
##    30         9          0.6211227  0.4052739  0.4658933
##    35         1          0.6886113  0.3770727  0.4239696
##    35         2          0.6449992  0.3956160  0.4470551
##    35         3          0.6341805  0.3991482  0.4558095
##    35         4          0.6254237  0.4068640  0.4589697
##    35         5          0.6233122  0.4069892  0.4628871
##    35         6          0.6236598  0.4042191  0.4645353
##    35         7          0.6235048  0.4030245  0.4655052
##    35         8          0.6226905  0.4034067  0.4657791
##    35         9          0.6210125  0.4056374  0.4658691
##    40         1          0.6884776  0.3772753  0.4240684
##    40         2          0.6448889  0.3957276  0.4472389
##    40         3          0.6340192  0.3993157  0.4559088
##    40         4          0.6252407  0.4070702  0.4591055
##    40         5          0.6231358  0.4071795  0.4630210
##    40         6          0.6234897  0.4043998  0.4646850
##    40         7          0.6233503  0.4031740  0.4655882
##    40         8          0.6225351  0.4035573  0.4658491
##    40         9          0.6208750  0.4057542  0.4659687
##    45         1          0.6887740  0.3771339  0.4241418
##    45         2          0.6449594  0.3957266  0.4472641
##    45         3          0.6340490  0.3993173  0.4559297
##    45         4          0.6252830  0.4070465  0.4591334
##    45         5          0.6231877  0.4071173  0.4630829
##    45         6          0.6235354  0.4043502  0.4648053
##    45         7          0.6233781  0.4031532  0.4656447
##    45         8          0.6225346  0.4035945  0.4658196
##    45         9          0.6208677  0.4058070  0.4659123
##    50         1          0.6885741  0.3774297  0.4239831
##    50         2          0.6447004  0.3961607  0.4471833
##    50         3          0.6337843  0.3997978  0.4559105
##    50         4          0.6250559  0.4074756  0.4591492
##    50         5          0.6229957  0.4075016  0.4631070
##    50         6          0.6233524  0.4047264  0.4647699
##    50         7          0.6231861  0.4035466  0.4655848
##    50         8          0.6223290  0.4040128  0.4657436
##    50         9          0.6206494  0.4062593  0.4658375
##    55         1          0.6886528  0.3773703  0.4240351
##    55         2          0.6447061  0.3961230  0.4472102
##    55         3          0.6338085  0.3997143  0.4560441
##    55         4          0.6250776  0.4073914  0.4592745
##    55         5          0.6230340  0.4073889  0.4632322
##    55         6          0.6233836  0.4046141  0.4648536
##    55         7          0.6232149  0.4034408  0.4656708
##    55         8          0.6223675  0.4038986  0.4658325
##    55         9          0.6207042  0.4061196  0.4659423
##    60         1          0.6886175  0.3774312  0.4241267
##    60         2          0.6446629  0.3962189  0.4473080
##    60         3          0.6337094  0.3998931  0.4561189
##    60         4          0.6249796  0.4075512  0.4593463
##    60         5          0.6229563  0.4075105  0.4633602
##    60         6          0.6232953  0.4047457  0.4649782
##    60         7          0.6231301  0.4035715  0.4657695
##    60         8          0.6222848  0.4040318  0.4658897
##    60         9          0.6206214  0.4062549  0.4659929
##    65         1          0.6885439  0.3776247  0.4242423
##    65         2          0.6445570  0.3963990  0.4473703
##    65         3          0.6335824  0.4000817  0.4560750
##    65         4          0.6248572  0.4077448  0.4593355
##    65         5          0.6228458  0.4076909  0.4633338
##    65         6          0.6232070  0.4048942  0.4649743
##    65         7          0.6230426  0.4037210  0.4657845
##    65         8          0.6222068  0.4041747  0.4659079
##    65         9          0.6205551  0.4063787  0.4660409
##    70         1          0.6886899  0.3776061  0.4243218
##    70         2          0.6447051  0.3963451  0.4475325
##    70         3          0.6337134  0.4000183  0.4561738
##    70         4          0.6249736  0.4076649  0.4594253
##    70         5          0.6229810  0.4075669  0.4634438
##    70         6          0.6233298  0.4047791  0.4650716
##    70         7          0.6231512  0.4036157  0.4659026
##    70         8          0.6222953  0.4040951  0.4659534
##    70         9          0.6206299  0.4063221  0.4660751
##    75         1          0.6887428  0.3776186  0.4244264
##    75         2          0.6447403  0.3963328  0.4476535
##    75         3          0.6337726  0.3999686  0.4562863
##    75         4          0.6250539  0.4075826  0.4595464
##    75         5          0.6230808  0.4074546  0.4635649
##    75         6          0.6234410  0.4046458  0.4652019
##    75         7          0.6232793  0.4034519  0.4660750
##    75         8          0.6224269  0.4039259  0.4661293
##    75         9          0.6207599  0.4061522  0.4662530
##    80         1          0.6887636  0.3777191  0.4244664
##    80         2          0.6447686  0.3963831  0.4477350
##    80         3          0.6338131  0.3999830  0.4563145
##    80         4          0.6251030  0.4075686  0.4596118
##    80         5          0.6231260  0.4074343  0.4636207
##    80         6          0.6234708  0.4046371  0.4652312
##    80         7          0.6233038  0.4034488  0.4660655
##    80         8          0.6224308  0.4039527  0.4660889
##    80         9          0.6207476  0.4062052  0.4661564
##    85         1          0.6888050  0.3777419  0.4245354
##    85         2          0.6447740  0.3964116  0.4477609
##    85         3          0.6338177  0.3999967  0.4563650
##    85         4          0.6250958  0.4075953  0.4596531
##    85         5          0.6231229  0.4074480  0.4636227
##    85         6          0.6234739  0.4046424  0.4652166
##    85         7          0.6233157  0.4034417  0.4660849
##    85         8          0.6224394  0.4039578  0.4661252
##    85         9          0.6207623  0.4062013  0.4661809
##    90         1          0.6888687  0.3777471  0.4245991
##    90         2          0.6448072  0.3964408  0.4477951
##    90         3          0.6338255  0.4000542  0.4563668
##    90         4          0.6251018  0.4076556  0.4596583
##    90         5          0.6231253  0.4075097  0.4636482
##    90         6          0.6234681  0.4047146  0.4652314
##    90         7          0.6233057  0.4035265  0.4660974
##    90         8          0.6224196  0.4040668  0.4661369
##    90         9          0.6207358  0.4063244  0.4661912
##    95         1          0.6887461  0.3779721  0.4244561
##    95         2          0.6446066  0.3967434  0.4476725
##    95         3          0.6336387  0.4003378  0.4563179
##    95         4          0.6249040  0.4079787  0.4595962
##    95         5          0.6229281  0.4078419  0.4635708
##    95         6          0.6232816  0.4050312  0.4651300
##    95         7          0.6231179  0.4038447  0.4660089
##    95         8          0.6222262  0.4043957  0.4660548
##    95         9          0.6205332  0.4066696  0.4660864
##   100         1          0.6887896  0.3779925  0.4244996
##   100         2          0.6445949  0.3968124  0.4477063
##   100         3          0.6336265  0.4003988  0.4563486
##   100         4          0.6249009  0.4080287  0.4596081
##   100         5          0.6229232  0.4078920  0.4635697
##   100         6          0.6232814  0.4050634  0.4651579
##   100         7          0.6231218  0.4038621  0.4660319
##   100         8          0.6222269  0.4044133  0.4660872
##   100         9          0.6205267  0.4067023  0.4661017
## 
## RMSE was used to select the optimal model using the smallest value.
## The final values used for the model were committees = 100 and neighbors = 9.
summary(m_cube)
## 
## Call:
## cubist.default(x = x, y = y, committees = param$committees, verbose = 0)
## 
## 
## Cubist [Release 2.07 GPL Edition]  Fri Mar 13 14:29:36 2020
## ---------------------------------
## 
##     Target attribute `outcome'
## 
## Read 1000 cases (12 attributes) from undefined.data
## 
## Model 1:
## 
##   Rule 1/1: [52 cases, mean 5.1, range 5 to 6, est err 0.1]
## 
##     if
##  `total sulfur dioxide` > 2.121659
##     then
##  outcome = 5
## 
##   Rule 1/2: [243 cases, mean 5.2, range 4 to 7, est err 0.3]
## 
##     if
##  `volatile acidity` > -0.7465141
##  `total sulfur dioxide` > -0.6102711
##  `total sulfur dioxide` <= 2.121659
##  alcohol > -1.200878
##  alcohol <= -0.4265552
##     then
##  outcome = 5.1 - 0.255 `volatile acidity` - 0.105 `citric acid`
##            - 0.076 `total sulfur dioxide` + 0.046 `residual sugar`
##            - 0.01 alcohol
## 
##   Rule 1/3: [37 cases, mean 5.2, range 3 to 7, est err 0.6]
## 
##     if
##  `free sulfur dioxide` <= -1.019859
##  sulphates <= -0.2648332
##  alcohol > -0.4265552
##     then
##  outcome = -1.2 - 5.883 `free sulfur dioxide` - 0.471 sulphates
##            - 0.352 `residual sugar` - 0.326 `volatile acidity` - 0.164 pH
## 
##   Rule 1/4: [28 cases, mean 5.4, range 3 to 6, est err 0.7]
## 
##     if
##  `total sulfur dioxide` <= 2.121659
##  alcohol <= -1.200878
##     then
##  outcome = 6 - 0.109 `volatile acidity` - 0.053 `total sulfur dioxide`
##            - 0.049 `citric acid` + 0.024 sulphates - 0.012 chlorides
##            + 0.01 `fixed acidity`
## 
##   Rule 1/5: [91 cases, mean 5.4, range 4 to 7, est err 0.5]
## 
##     if
##  `volatile acidity` > -0.7465141
##  `total sulfur dioxide` <= -0.6102711
##  alcohol > -1.200878
##  alcohol <= -0.4265552
##     then
##  outcome = 6.3 + 0.817 `total sulfur dioxide` - 0.253 `volatile acidity`
##            + 0.131 sulphates - 0.029 `citric acid`
##            + 0.021 `fixed acidity` - 0.019 alcohol
## 
##   Rule 1/6: [106 cases, mean 5.5, range 3 to 7, est err 0.5]
## 
##     if
##  `volatile acidity` > -0.1584431
##  `free sulfur dioxide` > -1.019859
##  sulphates <= -0.2648332
##  alcohol > -0.4265552
##     then
##  outcome = 5.9 + 0.498 sulphates - 0.226 `total sulfur dioxide`
##            + 0.176 `free sulfur dioxide` + 0.169 alcohol - 0.154 pH
##            - 0.141 `fixed acidity` - 0.121 `volatile acidity`
## 
##   Rule 1/7: [81 cases, mean 5.5, range 4 to 8, est err 0.4]
## 
##     if
##  `volatile acidity` <= -0.7465141
##  `total sulfur dioxide` <= 2.121659
##  alcohol <= -0.4265552
##     then
##  outcome = 4.9 - 0.48 `volatile acidity` + 0.306 `fixed acidity`
##            - 0.272 density + 0.187 sulphates + 0.027 alcohol
##            - 0.014 `total sulfur dioxide`
## 
##   Rule 1/8: [54 cases, mean 5.6, range 4 to 8, est err 0.5]
## 
##     if
##  `fixed acidity` <= -0.7235644
##  `volatile acidity` <= -0.1584431
##  alcohol > -0.4265552
##     then
##  outcome = 4.7 - 0.461 density - 0.309 `volatile acidity`
##            + 0.193 `residual sugar` - 0.13 `total sulfur dioxide`
##            + 0.059 alcohol + 0.028 sulphates - 0.026 pH
## 
##   Rule 1/9: [192 cases, mean 6.0, range 3 to 8, est err 0.6]
## 
##     if
##  `fixed acidity` > -0.7235644
##  `volatile acidity` <= -0.1584431
##  alcohol > -0.4265552
##  alcohol <= 1.606043
##     then
##  outcome = 5.4 - 0.386 `volatile acidity` + 0.317 alcohol
##            - 0.158 `total sulfur dioxide` + 0.149 sulphates - 0.138 pH
##            - 0.023 `fixed acidity` + 0.022 `free sulfur dioxide`
## 
##   Rule 1/10: [102 cases, mean 6.1, range 4 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` > -0.1584431
##  sulphates > -0.2648332
##  alcohol > -0.4265552
##     then
##  outcome = 6.1 - 0.23 density + 0.223 alcohol + 0.181 `citric acid`
## 
##   Rule 1/11: [46 cases, mean 6.6, range 5 to 8, est err 0.4]
## 
##     if
##  `fixed acidity` > -0.7235644
##  `volatile acidity` <= -0.1584431
##  alcohol > 1.606043
##     then
##  outcome = 6.6 - 0.404 `fixed acidity` - 0.399 chlorides
##            + 0.247 sulphates + 0.21 `residual sugar`
## 
## Model 2:
## 
##   Rule 2/1: [1000 cases, mean 5.6, range 3 to 8, est err 0.5]
## 
##  outcome = 5.5 + 0.31 alcohol - 0.204 `volatile acidity`
##            + 0.099 sulphates - 0.094 `total sulfur dioxide`
## 
## Model 3:
## 
##   Rule 3/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.6 - 0.678 alcohol + 0.334 `fixed acidity`
##            - 0.252 `citric acid` + 0.178 pH - 0.158 `volatile acidity`
##            - 0.073 `free sulfur dioxide`
## 
##   Rule 3/2: [88 cases, mean 5.3, range 3 to 7, est err 0.8]
## 
##     if
##  `free sulfur dioxide` <= -0.5185026
##  sulphates <= -0.3194155
##  alcohol > -0.4265552
##     then
##  outcome = 5 - 0.645 pH - 0.398 `fixed acidity` + 0.336 chlorides
##            - 0.26 `volatile acidity` + 0.037 alcohol
##            + 0.028 `free sulfur dioxide`
## 
##   Rule 3/3: [47 cases, mean 5.5, range 3 to 8, est err 0.7]
## 
##     if
##  `fixed acidity` > 0.8554384
##  sulphates <= 1.099724
##  alcohol <= -0.4265552
##     then
##  outcome = 4.9 + 1.085 sulphates + 0.698 `fixed acidity` + 0.045 alcohol
##            - 0.027 `total sulfur dioxide` - 0.024 `volatile acidity`
##            - 0.019 chlorides - 0.011 `citric acid`
##            + 0.011 `free sulfur dioxide`
## 
##   Rule 3/4: [522 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 6 + 0.468 sulphates - 0.407 chlorides - 0.235 pH
##            + 0.221 alcohol - 0.177 `total sulfur dioxide`
##            - 0.147 `fixed acidity` + 0.138 `free sulfur dioxide`
## 
##   Rule 3/5: [291 cases, mean 6.1, range 3 to 8, est err 0.7]
## 
##     if
##  `total sulfur dioxide` > -1.120632
##  sulphates > -0.3194155
##  alcohol > -0.4265552
##  alcohol <= 2.573946
##     then
##  outcome = 5.4 - 0.49 `total sulfur dioxide` + 0.225 alcohol - 0.221 pH
##            - 0.159 `fixed acidity` - 0.014 `volatile acidity`
## 
##   Rule 3/6: [51 cases, mean 6.1, range 5 to 8, est err 0.8]
## 
##     if
##  `citric acid` <= -0.5225012
##  `total sulfur dioxide` > -1.120632
##  sulphates > -0.3194155
##  alcohol > -0.4265552
##  alcohol <= 2.573946
##     then
##  outcome = 7.8 + 1.358 `citric acid` + 0.82 alcohol
##            - 0.048 `total sulfur dioxide` - 0.044 pH
##            - 0.028 `fixed acidity`
## 
##   Rule 3/7: [243 cases, mean 6.2, range 3 to 8, est err 0.6]
## 
##     if
##  `fixed acidity` > -0.5057709
##  sulphates > -0.3194155
##  alcohol > -0.4265552
##  alcohol <= 2.573946
##     then
##  outcome = 6.1 - 0.456 `fixed acidity` + 0.427 `citric acid` - 0.388 pH
##            + 0.22 `residual sugar` + 0.145 alcohol
##            - 0.096 `volatile acidity` - 0.091 `total sulfur dioxide`
## 
##   Rule 3/8: [15 cases, mean 6.3, range 5 to 8, est err 1.4]
## 
##     if
##  sulphates > -0.3194155
##  alcohol > 2.573946
##     then
##  outcome = 5.2 - 1.562 `total sulfur dioxide` + 0.643 pH
## 
##   Rule 3/9: [20 cases, mean 6.6, range 5 to 7, est err 0.7]
## 
##     if
##  `total sulfur dioxide` <= -1.120632
##  sulphates > -0.3194155
##  alcohol > -0.4265552
##     then
##  outcome = 27.4 + 17.461 `total sulfur dioxide` - 0.036 pH
##            - 0.033 `fixed acidity` + 0.028 alcohol
## 
## Model 4:
## 
##   Rule 4/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 5.2 - 0.14 `volatile acidity` + 0.082 sulphates
##            - 0.071 `total sulfur dioxide` + 0.028 alcohol
## 
##   Rule 4/2: [144 cases, mean 5.5, range 3 to 8, est err 0.6]
## 
##     if
##  `total sulfur dioxide` <= -0.5502287
##  alcohol <= -0.4265552
##     then
##  outcome = 6.7 + 0.956 `total sulfur dioxide` + 0.944 alcohol
##            - 0.177 `volatile acidity` + 0.135 sulphates
## 
##   Rule 4/3: [95 cases, mean 5.7, range 3 to 8, est err 0.8]
## 
##     if
##  `total sulfur dioxide` <= -0.5502287
##  sulphates > -0.5923269
##  alcohol <= -0.4265552
##     then
##  outcome = 8.5 + 1.575 `total sulfur dioxide` + 1.225 alcohol
##            - 0.23 `volatile acidity` + 0.175 sulphates
## 
##   Rule 4/4: [522 cases, mean 5.9, range 3 to 8, est err 0.6]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.5 + 0.395 alcohol - 0.256 `volatile acidity`
##            - 0.162 `total sulfur dioxide` + 0.162 sulphates
## 
## Model 5:
## 
##   Rule 5/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.8 - 0.464 alcohol + 0.351 `fixed acidity`
##            - 0.224 `citric acid` - 0.179 `volatile acidity` + 0.141 pH
##            - 0.07 density - 0.036 `total sulfur dioxide`
##            + 0.024 sulphates - 0.022 chlorides
##            - 0.022 `free sulfur dioxide`
## 
##   Rule 5/2: [88 cases, mean 5.3, range 3 to 7, est err 0.9]
## 
##     if
##  `free sulfur dioxide` <= -0.5185026
##  sulphates <= -0.3194155
##  alcohol > -0.4265552
##     then
##  outcome = 4.8 - 0.823 pH - 0.548 `fixed acidity`
##            + 0.066 `free sulfur dioxide` + 0.052 alcohol
## 
##   Rule 5/3: [196 cases, mean 5.5, range 3 to 7, est err 0.6]
## 
##     if
##  sulphates <= -0.3194155
##  alcohol > -0.4265552
##     then
##  outcome = 5.9 - 0.503 chlorides + 0.399 sulphates - 0.187 pH
##            + 0.125 alcohol - 0.122 `fixed acidity`
##            + 0.115 `free sulfur dioxide` - 0.093 `total sulfur dioxide`
## 
##   Rule 5/4: [326 cases, mean 6.1, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > -0.3194155
##  alcohol > -0.4265552
##     then
##  outcome = 6.1 - 0.383 `total sulfur dioxide` - 0.306 pH
##            - 0.29 `fixed acidity` + 0.182 alcohol + 0.016 sulphates
##            + 0.013 `free sulfur dioxide`
## 
## Model 6:
## 
##   Rule 6/1: [1000 cases, mean 5.6, range 3 to 8, est err 0.5]
## 
##  outcome = 5.5 + 0.278 alcohol - 0.248 `volatile acidity`
##            + 0.136 sulphates - 0.099 `total sulfur dioxide`
## 
## Model 7:
## 
##   Rule 7/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.7 - 0.639 alcohol + 0.278 sulphates - 0.212 `citric acid`
##            + 0.206 `fixed acidity` + 0.041 pH
##            - 0.013 `total sulfur dioxide` - 0.01 chlorides
##            - 0.009 `volatile acidity`
## 
##   Rule 7/2: [54 cases, mean 5.5, range 3 to 8, est err 0.9]
## 
##     if
##  `fixed acidity` > 0.8554384
##  alcohol <= -0.4265552
##     then
##  outcome = 4.8 + 1.05 sulphates + 0.691 `fixed acidity` + 0.046 alcohol
##            - 0.024 `total sulfur dioxide` - 0.018 chlorides
##            - 0.016 `volatile acidity` + 0.011 `free sulfur dioxide`
##            - 0.01 `citric acid`
## 
##   Rule 7/3: [159 cases, mean 5.7, range 3 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= -0.159953
##  alcohol > -0.4265552
##     then
##  outcome = 7 + 1.424 `total sulfur dioxide` + 0.393 sulphates
##            - 0.06 `volatile acidity`
## 
##   Rule 7/4: [196 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  `total sulfur dioxide` > -0.159953
##  alcohol > -0.4265552
##     then
##  outcome = 5.9 - 0.512 `total sulfur dioxide` + 0.43 alcohol - 0.349 pH
##            + 0.196 `free sulfur dioxide` + 0.028 sulphates
##            - 0.008 `volatile acidity`
## 
##   Rule 7/5: [255 cases, mean 6.1, range 3 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  alcohol > -0.4265552
##     then
##  outcome = 4.9 - 0.949 `volatile acidity` - 0.447 pH
##            - 0.068 `total sulfur dioxide` + 0.054 alcohol
##            + 0.052 sulphates + 0.04 `free sulfur dioxide`
##            - 0.027 `fixed acidity`
## 
##   Rule 7/6: [121 cases, mean 6.5, range 4 to 8, est err 0.8]
## 
##     if
##  alcohol > 1.218881
##     then
##  outcome = 7.7 - 0.661 alcohol - 0.477 `total sulfur dioxide`
##            + 0.451 `volatile acidity` - 0.437 chlorides + 0.406 sulphates
##            + 0.381 `citric acid` - 0.321 `fixed acidity` - 0.31 density
##            + 0.287 `residual sugar` - 0.029 pH
##            + 0.019 `free sulfur dioxide`
## 
## Model 8:
## 
##   Rule 8/1: [1000 cases, mean 5.6, range 3 to 8, est err 0.5]
## 
##  outcome = 5.4 + 0.305 alcohol - 0.296 `volatile acidity`
##            - 0.114 `total sulfur dioxide`
## 
## Model 9:
## 
##   Rule 9/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.7 - 0.544 alcohol + 0.333 `fixed acidity`
##            - 0.172 `citric acid` + 0.153 pH + 0.101 sulphates
##            - 0.075 density
## 
##   Rule 9/2: [24 cases, mean 5.6, range 3 to 8, est err 1.0]
## 
##     if
##  `fixed acidity` > 1.508819
##  alcohol <= -0.4265552
##     then
##  outcome = 1.8 + 1.732 `fixed acidity` + 0.715 sulphates + 0.012 alcohol
## 
##   Rule 9/3: [522 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 6 + 0.529 sulphates - 0.469 chlorides - 0.195 pH
##            + 0.191 alcohol - 0.142 `total sulfur dioxide`
##            - 0.128 `fixed acidity` + 0.121 `free sulfur dioxide`
## 
## Model 10:
## 
##   Rule 10/1: [1000 cases, mean 5.6, range 3 to 8, est err 0.6]
## 
##  outcome = 5.4 - 0.325 `volatile acidity` - 0.181 `total sulfur dioxide`
##            + 0.146 alcohol
## 
## Model 11:
## 
##   Rule 11/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.7 - 0.391 alcohol + 0.244 `fixed acidity`
##            - 0.169 `citric acid` + 0.11 pH + 0.082 sulphates
## 
##   Rule 11/2: [24 cases, mean 5.6, range 3 to 8, est err 1.0]
## 
##     if
##  `fixed acidity` > 1.508819
##  alcohol <= -0.4265552
##     then
##  outcome = 1.8 + 1.643 `fixed acidity` + 0.717 sulphates + 0.023 alcohol
## 
##   Rule 11/3: [45 cases, mean 5.8, range 5 to 8, est err 0.6]
## 
##     if
##  `fixed acidity` <= -0.7780128
##  sulphates > -0.2102509
##  alcohol > -0.4265552
##     then
##  outcome = 5.3 - 0.704 density + 0.628 `volatile acidity` + 0.065 alcohol
##            - 0.059 `total sulfur dioxide` - 0.052 `fixed acidity`
##            - 0.049 pH
## 
##   Rule 11/4: [522 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.5 + 0.536 alcohol + 0.297 `free sulfur dioxide` - 0.234 pH
##            + 0.034 sulphates
## 
##   Rule 11/5: [250 cases, mean 6.2, range 3 to 8, est err 0.7]
## 
##     if
##  `fixed acidity` > -0.7780128
##  sulphates > -0.2102509
##  alcohol > -0.4265552
##     then
##  outcome = 6.5 + 0.378 alcohol - 0.338 `fixed acidity` - 0.286 pH
##            - 0.181 `total sulfur dioxide` + 0.015 sulphates
##            - 0.008 chlorides
## 
## Model 12:
## 
##   Rule 12/1: [18 cases, mean 5.3, range 3 to 6, est err 1.7]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  alcohol <= -1.200878
##     then
##  outcome = 17.2 + 8.657 alcohol
## 
##   Rule 12/2: [350 cases, mean 5.3, range 4 to 8, est err 0.4]
## 
##     if
##  `total sulfur dioxide` > 0.05019546
##     then
##  outcome = 5.4 - 0.197 `volatile acidity` - 0.17 density
##            + 0.128 `fixed acidity` - 0.087 `total sulfur dioxide`
##            + 0.037 alcohol
## 
##   Rule 12/3: [64 cases, mean 5.6, range 3 to 7, est err 0.9]
## 
##     if
##  `total sulfur dioxide` <= 0.05019546
##  sulphates <= -0.2648332
##  alcohol > 0.5413485
##     then
##  outcome = 3.4 + 1.182 alcohol - 0.363 `fixed acidity`
##            + 0.349 `citric acid` - 0.061 `volatile acidity`
##            + 0.024 sulphates
## 
##   Rule 12/4: [650 cases, mean 5.7, range 3 to 8, est err 0.7]
## 
##     if
##  `total sulfur dioxide` <= 0.05019546
##     then
##  outcome = 6 - 0.496 `volatile acidity` + 0.41 alcohol
##            + 0.218 `residual sugar` + 0.188 sulphates
##            - 0.049 `citric acid`
## 
##   Rule 12/5: [409 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` <= -0.3264634
##     then
##  outcome = 5.1 - 0.676 `volatile acidity` - 0.267 `total sulfur dioxide`
##            + 0.092 `citric acid` + 0.043 sulphates - 0.035 density
##            - 0.025 chlorides + 0.022 `residual sugar`
##            - 0.021 `free sulfur dioxide`
## 
##   Rule 12/6: [64 cases, mean 6.2, range 4 to 8, est err 0.8]
## 
##     if
##  `volatile acidity` > -0.3264634
##  sulphates > -0.2648332
##  alcohol > 0.5413485
##     then
##  outcome = 5 + 1.177 alcohol - 1.144 sulphates - 0.236 density
##            + 0.048 `citric acid` - 0.046 `fixed acidity`
## 
## Model 13:
## 
##   Rule 13/1: [1000 cases, mean 5.6, range 3 to 8, est err 0.5]
## 
##  outcome = 5.5 + 0.391 alcohol + 0.166 `free sulfur dioxide`
##            - 0.155 `total sulfur dioxide` + 0.153 sulphates
##            - 0.135 chlorides - 0.101 pH
## 
## Model 14:
## 
##   Rule 14/1: [126 cases, mean 5.3, range 4 to 7, est err 0.5]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  alcohol <= -0.6201359
##     then
##  outcome = 3.4 - 1.651 alcohol - 0.911 `volatile acidity`
##            + 0.594 `fixed acidity` - 0.556 `citric acid` + 0.418 pH
##            + 0.271 chlorides - 0.022 `total sulfur dioxide`
##            - 0.017 `free sulfur dioxide`
## 
##   Rule 14/2: [752 cases, mean 5.4, range 3 to 8, est err 0.5]
## 
##     if
##  alcohol <= 0.5413485
##     then
##  outcome = 5.4 + 0.27 alcohol - 0.215 `volatile acidity`
##            - 0.097 `free sulfur dioxide`
## 
##   Rule 14/3: [396 cases, mean 5.5, range 3 to 8, est err 0.6]
## 
##     if
##  `total sulfur dioxide` <= 0.05019546
##  sulphates <= -0.0465041
##     then
##  outcome = 6 + 0.638 sulphates - 0.476 `volatile acidity`
##            - 0.437 `citric acid` + 0.364 chlorides + 0.282 alcohol
##            - 0.23 pH + 0.011 `residual sugar`
## 
##   Rule 14/4: [69 cases, mean 5.8, range 4 to 7, est err 0.8]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  sulphates > -0.0465041
##  alcohol <= 0.5413485
##     then
##  outcome = 6.7 + 0.94 alcohol + 0.437 density - 0.046 `volatile acidity`
##            + 0.032 sulphates + 0.03 `residual sugar`
## 
##   Rule 14/5: [409 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` <= -0.3264634
##     then
##  outcome = 5 - 0.977 `volatile acidity` - 0.204 `total sulfur dioxide`
##            + 0.194 `citric acid` + 0.189 alcohol
##            - 0.116 `free sulfur dioxide`
## 
##   Rule 14/6: [111 cases, mean 5.9, range 3 to 8, est err 0.8]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol > 0.5413485
##     then
##  outcome = 4.4 + 1.451 alcohol - 0.548 `volatile acidity`
##            - 0.113 `fixed acidity` + 0.058 sulphates
## 
##   Rule 14/7: [12 cases, mean 6.1, range 4 to 8, est err 1.6]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol > 2.477156
##     then
##  outcome = 4 + 2.395 `volatile acidity` + 0.052 alcohol + 0.048 sulphates
## 
## Model 15:
## 
##   Rule 15/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.9 - 0.161 alcohol + 0.119 `fixed acidity`
##            - 0.096 `citric acid` - 0.085 `total sulfur dioxide`
##            + 0.074 `free sulfur dioxide` + 0.067 sulphates
##            - 0.062 chlorides - 0.05 pH
## 
##   Rule 15/2: [522 cases, mean 5.9, range 3 to 8, est err 0.6]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.6 + 0.297 alcohol - 0.247 `total sulfur dioxide`
##            + 0.227 `free sulfur dioxide` + 0.201 sulphates - 0.152 pH
##            - 0.089 chlorides
## 
## Model 16:
## 
##   Rule 16/1: [14 cases, mean 5.2, range 3 to 6, est err 2.0]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  pH <= 0.7021303
##  sulphates <= -0.0465041
##  alcohol <= -1.200878
##     then
##  outcome = 14.5 + 8.607 sulphates + 4.654 alcohol + 4.437 pH
##            + 0.911 `volatile acidity` - 0.008 `citric acid`
## 
##   Rule 16/2: [391 cases, mean 5.2, range 3 to 7, est err 0.5]
## 
##     if
##  alcohol <= -0.6201359
##     then
##  outcome = 3.8 - 1.391 alcohol - 0.486 `volatile acidity`
##            - 0.197 `citric acid` + 0.189 `fixed acidity` + 0.138 pH
##            + 0.092 chlorides - 0.027 `free sulfur dioxide`
##            + 0.023 sulphates - 0.019 `total sulfur dioxide`
## 
##   Rule 16/3: [289 cases, mean 5.3, range 4 to 7, est err 0.5]
## 
##     if
##  `volatile acidity` > -0.3264634
##  pH <= 0.7021303
##  sulphates <= -0.0465041
##  alcohol > -1.200878
##     then
##  outcome = 6.1 + 0.769 sulphates - 0.404 `volatile acidity`
##            - 0.319 `citric acid` + 0.318 chlorides + 0.178 alcohol
##            - 0.128 `fixed acidity` + 0.025 density - 0.014 pH
## 
##   Rule 16/4: [118 cases, mean 5.3, range 3 to 7, est err 0.5]
## 
##     if
##  `volatile acidity` > -0.3264634
##  pH > 0.7021303
##  alcohol <= 0.5413485
##     then
##  outcome = 5.7 - 0.719 `volatile acidity` + 0.042 alcohol
## 
##   Rule 16/5: [36 cases, mean 5.3, range 4 to 6, est err 0.8]
## 
##     if
##  `volatile acidity` > -0.4944837
##  `volatile acidity` <= -0.3264634
##  alcohol > -0.6201359
##     then
##  outcome = 4.7 + 0.445 `citric acid` + 0.32 pH
## 
##   Rule 16/6: [591 cases, mean 5.4, range 3 to 8, est err 0.5]
## 
##     if
##  `volatile acidity` > -0.3264634
##     then
##  outcome = 5.4 - 0.254 `volatile acidity` + 0.179 alcohol
##            - 0.057 `total sulfur dioxide`
## 
##   Rule 16/7: [72 cases, mean 5.5, range 4 to 7, est err 0.8]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  sulphates > -0.4831623
##  alcohol <= -0.6201359
##     then
##  outcome = 4.7 - 1.499 `volatile acidity` - 0.776 `citric acid`
##            + 0.659 density - 0.317 `residual sugar` - 0.291 alcohol
##            + 0.276 chlorides - 0.221 sulphates + 0.112 `fixed acidity`
##            + 0.082 pH
## 
##   Rule 16/8: [419 cases, mean 5.8, range 3 to 8, est err 0.7]
## 
##     if
##  `free sulfur dioxide` <= 0.8852948
##  sulphates <= 0.8268123
##  alcohol > -0.6201359
##     then
##  outcome = 6.2 + 0.818 sulphates - 0.42 chlorides - 0.406 density
##            + 0.318 `residual sugar` + 0.229 `fixed acidity`
##            - 0.143 `volatile acidity` + 0.048 `citric acid`
##            - 0.044 `total sulfur dioxide` - 0.021 pH
## 
##   Rule 16/9: [69 cases, mean 5.8, range 4 to 7, est err 0.9]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  sulphates > -0.0465041
##  alcohol <= 0.5413485
##     then
##  outcome = 6.6 - 0.257 `volatile acidity` + 0.188 alcohol
##            - 0.115 `total sulfur dioxide` + 0.078 sulphates
##            - 0.024 `fixed acidity` + 0.023 density - 0.013 pH
##            - 0.011 `citric acid`
## 
##   Rule 16/10: [99 cases, mean 5.8, range 3 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol > 0.5413485
##  alcohol <= 2.477156
##     then
##  outcome = 4.3 + 1.524 alcohol - 0.528 `volatile acidity`
##            + 0.318 `total sulfur dioxide` - 0.194 density
##            + 0.021 sulphates
## 
##   Rule 16/11: [283 cases, mean 6.1, range 3 to 8, est err 0.8]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  alcohol > -0.6201359
##     then
##  outcome = 4.3 - 1.111 chlorides - 0.964 `volatile acidity`
##            + 0.175 `citric acid` - 0.161 `total sulfur dioxide`
##            - 0.143 `fixed acidity` + 0.077 `residual sugar` - 0.077 pH
## 
##   Rule 16/12: [12 cases, mean 6.1, range 4 to 8, est err 1.4]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol > 2.477156
##     then
##  outcome = 4.5 + 2.474 `volatile acidity` + 0.043 alcohol
##            + 0.028 sulphates
## 
##   Rule 16/13: [45 cases, mean 6.3, range 5 to 8, est err 0.9]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  `free sulfur dioxide` <= 0.8852948
##  sulphates > 0.8268123
##  alcohol > -0.6201359
##     then
##  outcome = 6.4 - 1.164 `fixed acidity` - 0.91 pH
##            - 0.731 `volatile acidity` + 0.046 sulphates - 0.024 density
## 
## Model 17:
## 
##   Rule 17/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 5.2 + 0.114 alcohol + 0.112 `fixed acidity`
##            - 0.055 `total sulfur dioxide` + 0.038 `free sulfur dioxide`
##            + 0.034 sulphates
## 
##   Rule 17/2: [397 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates <= 0.553901
##  alcohol > -0.4265552
##     then
##  outcome = 5.9 + 0.693 sulphates + 0.407 alcohol
##            - 0.398 `total sulfur dioxide` + 0.384 `free sulfur dioxide`
##            - 0.227 pH
## 
##   Rule 17/3: [522 cases, mean 5.9, range 3 to 8, est err 0.6]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.6 + 0.433 alcohol - 0.256 `total sulfur dioxide`
##            + 0.208 sulphates + 0.192 `free sulfur dioxide` - 0.124 pH
## 
## Model 18:
## 
##   Rule 18/1: [53 cases, mean 5.4, range 3 to 7, est err 0.7]
## 
##     if
##  `volatile acidity` > -0.3264634
##  sulphates <= -0.1556687
##  alcohol > 0.5413485
##     then
##  outcome = 5 + 0.302 `free sulfur dioxide` + 0.286 alcohol
##            + 0.23 sulphates - 0.082 `fixed acidity`
##            - 0.07 `volatile acidity` - 0.028 `citric acid`
##            - 0.013 `total sulfur dioxide`
## 
##   Rule 18/2: [752 cases, mean 5.4, range 3 to 8, est err 0.5]
## 
##     if
##  alcohol <= 0.5413485
##     then
##  outcome = 5.2 - 0.217 `volatile acidity` + 0.138 alcohol
##            - 0.091 `citric acid` - 0.054 `free sulfur dioxide`
##            + 0.047 `residual sugar` - 0.041 `total sulfur dioxide`
## 
##   Rule 18/3: [650 cases, mean 5.7, range 3 to 8, est err 0.6]
## 
##     if
##  `total sulfur dioxide` <= 0.05019546
##     then
##  outcome = 5.8 - 0.438 `volatile acidity` + 0.283 alcohol
##            + 0.266 sulphates + 0.23 `residual sugar`
##            - 0.226 `citric acid`
## 
##   Rule 18/4: [409 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` <= -0.3264634
##     then
##  outcome = 4.9 - 0.922 `volatile acidity` - 0.25 `free sulfur dioxide`
##            + 0.175 sulphates - 0.15 chlorides + 0.113 alcohol
## 
##   Rule 18/5: [58 cases, mean 6.3, range 5 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` > -0.3264634
##  sulphates > -0.1556687
##  alcohol > 0.5413485
##     then
##  outcome = 5.4 - 1.065 sulphates + 1.003 alcohol - 0.365 `fixed acidity`
## 
## Model 19:
## 
##   Rule 19/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.8 - 0.417 alcohol + 0.163 `fixed acidity` + 0.113 pH
##            - 0.016 `total sulfur dioxide` + 0.014 `free sulfur dioxide`
##            - 0.012 density + 0.012 sulphates
## 
##   Rule 19/2: [30 cases, mean 5.5, range 4 to 8, est err 0.6]
## 
##     if
##  `fixed acidity` > 0.8554384
##  alcohol > -0.910507
##  alcohol <= -0.4265552
##     then
##  outcome = 8.3 + 5.19 alcohol + 0.156 `fixed acidity`
## 
##   Rule 19/3: [24 cases, mean 5.5, range 3 to 7, est err 0.9]
## 
##     if
##  `fixed acidity` > 0.8554384
##  alcohol <= -0.910507
##     then
##  outcome = 6.1 + 3.71 alcohol - 1.162 pH + 1.101 `fixed acidity`
## 
##   Rule 19/4: [522 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.9 + 0.326 alcohol - 0.278 `total sulfur dioxide`
##            + 0.25 sulphates + 0.239 `free sulfur dioxide` - 0.239 pH
## 
## Model 20:
## 
##   Rule 20/1: [32 cases, mean 5.2, range 3 to 7, est err 1.5]
## 
##     if
##  `volatile acidity` > -0.3264634
##  sulphates <= -0.1556687
##  alcohol > 0.6381389
##  alcohol <= 1.896414
##     then
##  outcome = 2.1 + 2.871 alcohol - 0.798 `volatile acidity`
##            - 0.784 `fixed acidity` + 0.46 `citric acid`
##            - 0.412 `residual sugar` - 0.058 pH
## 
##   Rule 20/2: [591 cases, mean 5.4, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` > -0.3264634
##     then
##  outcome = 5.4 - 0.404 `volatile acidity` + 0.13 alcohol
##            - 0.117 `citric acid` - 0.1 `total sulfur dioxide`
## 
##   Rule 20/3: [409 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` <= -0.3264634
##     then
##  outcome = 4.8 - 0.939 `volatile acidity` - 0.205 `free sulfur dioxide`
##            + 0.168 alcohol
## 
##   Rule 20/4: [11 cases, mean 6.0, range 4 to 7, est err 1.0]
## 
##     if
##  `volatile acidity` > -0.3264634
##  sulphates <= -0.1556687
##  alcohol > 1.896414
##     then
##  outcome = 6.1 + 4.649 sulphates + 2.367 `volatile acidity`
## 
##   Rule 20/5: [55 cases, mean 6.3, range 5 to 8, est err 0.9]
## 
##     if
##  `volatile acidity` > -0.3264634
##  sulphates > -0.1556687
##  alcohol > 0.6381389
##     then
##  outcome = 5.2 - 1.183 sulphates + 1.097 alcohol - 0.482 `fixed acidity`
##            - 0.31 `free sulfur dioxide`
## 
## Model 21:
## 
##   Rule 21/1: [478 cases, mean 5.3, range 3 to 8, est err 0.5]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 5.4 + 0.357 `fixed acidity` + 0.277 pH
## 
##   Rule 21/2: [254 cases, mean 5.3, range 4 to 8, est err 0.5]
## 
##     if
##  `total sulfur dioxide` > 0.4404711
##     then
##  outcome = 4.9 + 0.227 `volatile acidity` + 0.184 `free sulfur dioxide`
## 
##   Rule 21/3: [906 cases, mean 5.6, range 3 to 8, est err 0.7]
## 
##     if
##  sulphates <= 1.099724
##     then
##  outcome = 5.2 + 0.618 sulphates + 0.221 `fixed acidity`
##            - 0.202 `citric acid` - 0.116 alcohol
## 
##   Rule 21/4: [522 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.9 + 0.458 alcohol + 0.281 sulphates
##            - 0.276 `total sulfur dioxide` + 0.213 `free sulfur dioxide`
##            - 0.186 pH - 0.04 chlorides
## 
## Model 22:
## 
##   Rule 22/1: [428 cases, mean 5.3, range 3 to 7, est err 0.4]
## 
##     if
##  alcohol <= -0.5233455
##     then
##  outcome = 5.2 - 0.252 `volatile acidity` - 0.173 `total sulfur dioxide`
##            + 0.04 alcohol
## 
##   Rule 22/2: [104 cases, mean 5.6, range 3 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= -0.6402923
##  alcohol > -0.5233455
##     then
##  outcome = 5.7 - 0.667 `volatile acidity` - 0.307 density + 0.155 alcohol
## 
##   Rule 22/3: [358 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  `total sulfur dioxide` > -0.6402923
##  alcohol > -0.5233455
##     then
##  outcome = 5.9 + 0.619 alcohol - 0.326 `total sulfur dioxide`
##            - 0.253 `volatile acidity` - 0.24 pH - 0.031 `fixed acidity`
## 
##   Rule 22/4: [228 cases, mean 6.0, range 3 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` > -1.446599
##  `volatile acidity` <= -0.3264634
##  alcohol > -0.5233455
##     then
##  outcome = 4.7 - 1.282 `volatile acidity` - 0.444 chlorides
##            + 0.358 `citric acid` + 0.342 alcohol - 0.328 `fixed acidity`
##            - 0.238 `total sulfur dioxide` - 0.2 pH
##            + 0.143 `residual sugar`
## 
##   Rule 22/5: [270 cases, mean 6.1, range 3 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  alcohol > -0.5233455
##     then
##  outcome = 5.6 - 0.359 density - 0.324 `volatile acidity`
##            + 0.148 `citric acid` - 0.136 `fixed acidity`
##            - 0.134 chlorides + 0.099 alcohol
##            - 0.099 `total sulfur dioxide` - 0.083 pH
##            + 0.059 `residual sugar`
## 
## Model 23:
## 
##   Rule 23/1: [730 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.2809896
##     then
##  outcome = 5.6 + 0.68 sulphates + 0.308 `fixed acidity` - 0.21 density
##            - 0.186 `citric acid` + 0.096 `residual sugar`
## 
##   Rule 23/2: [961 cases, mean 5.6, range 3 to 8, est err 0.6]
## 
##     if
##  alcohol <= 2.186785
##     then
##  outcome = 5.8 + 0.362 alcohol - 0.291 `total sulfur dioxide`
##            + 0.241 density - 0.179 `volatile acidity`
## 
##   Rule 23/3: [39 cases, mean 6.4, range 4 to 8, est err 1.4]
## 
##     if
##  alcohol > 2.186785
##     then
##  outcome = 12.5 - 1.879 alcohol - 0.021 `total sulfur dioxide`
## 
## Model 24:
## 
##   Rule 24/1: [478 cases, mean 5.3, range 3 to 8, est err 0.5]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.7 - 0.34 alcohol - 0.246 `volatile acidity`
##            - 0.153 `citric acid` + 0.067 `fixed acidity` - 0.043 density
##            - 0.031 `total sulfur dioxide` + 0.031 sulphates
##            - 0.029 chlorides - 0.026 pH + 0.024 `free sulfur dioxide`
## 
##   Rule 24/2: [522 cases, mean 5.9, range 3 to 8, est err 0.6]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.6 + 0.381 alcohol - 0.342 pH - 0.299 `fixed acidity`
##            - 0.243 `total sulfur dioxide` - 0.235 `volatile acidity`
##            + 0.188 sulphates + 0.168 `free sulfur dioxide`
##            - 0.049 density - 0.033 chlorides
## 
## Model 25:
## 
##   Rule 25/1: [563 cases, mean 5.4, range 3 to 7, est err 0.5]
## 
##     if
##  sulphates <= -0.1556687
##     then
##  outcome = 5.7 + 0.628 sulphates - 0.09 density + 0.079 `fixed acidity`
##            + 0.017 alcohol - 0.016 `total sulfur dioxide`
## 
##   Rule 25/2: [437 cases, mean 5.9, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > -0.1556687
##     then
##  outcome = 6 - 0.397 `total sulfur dioxide` + 0.136 `fixed acidity`
##            + 0.025 alcohol + 0.02 sulphates
## 
## Model 26:
## 
##   Rule 26/1: [478 cases, mean 5.3, range 3 to 8, est err 0.6]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.8 - 0.293 `volatile acidity` - 0.275 `citric acid`
##            + 0.181 `fixed acidity`
## 
##   Rule 26/2: [32 cases, mean 5.3, range 3 to 7, est err 0.9]
## 
##     if
##  `volatile acidity` > -0.1584431
##  `free sulfur dioxide` <= -1.019859
##  alcohol > -0.4265552
##     then
##  outcome = -8 - 13.116 `free sulfur dioxide` - 0.897 `volatile acidity`
##            + 0.043 alcohol - 0.031 `fixed acidity` - 0.026 pH
## 
##   Rule 26/3: [522 cases, mean 5.4, range 3 to 8, est err 0.5]
## 
##     if
##  `volatile acidity` > -0.1584431
##     then
##  outcome = 5.9 + 0.545 alcohol - 0.345 `volatile acidity`
##            - 0.327 `fixed acidity` - 0.3 pH
##            - 0.147 `total sulfur dioxide` + 0.113 `free sulfur dioxide`
##            + 0.077 sulphates - 0.008 `citric acid`
## 
##   Rule 26/4: [42 cases, mean 5.7, range 3 to 7, est err 0.8]
## 
##     if
##  `volatile acidity` <= -0.1584431
##  chlorides > 0.1327215
##  pH > -1.703726
##  alcohol > -0.4265552
##     then
##  outcome = 4.8 - 1.261 pH - 0.853 `fixed acidity` + 0.625 `citric acid`
##            - 0.219 `volatile acidity` + 0.165 alcohol
## 
##   Rule 26/5: [32 cases, mean 5.8, range 4 to 8, est err 1.1]
## 
##     if
##  `volatile acidity` > -0.1584431
##  `free sulfur dioxide` > -1.019859
##  pH > 1.33525
##  alcohol > -0.4265552
##     then
##  outcome = 10.1 + 2.633 `fixed acidity` - 1.232 pH + 1.104 alcohol
##            - 0.797 density
## 
##   Rule 26/6: [10 cases, mean 5.9, range 5 to 7, est err 1.4]
## 
##     if
##  `volatile acidity` <= -0.1584431
##  pH <= -1.703726
##  alcohol > -0.4265552
##     then
##  outcome = -2.9 - 4.388 pH
## 
##   Rule 26/7: [292 cases, mean 6.1, range 3 to 8, est err 0.8]
## 
##     if
##  `volatile acidity` <= -0.1584431
##  alcohol > -0.4265552
##     then
##  outcome = 5.1 - 0.773 `volatile acidity` + 0.569 alcohol
##            - 0.399 `total sulfur dioxide` + 0.346 chlorides - 0.329 pH
##            + 0.303 `residual sugar` + 0.221 `free sulfur dioxide`
##            - 0.198 density
## 
## Model 27:
## 
##   Rule 27/1: [730 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.2809896
##     then
##  outcome = 5.6 + 0.542 sulphates + 0.138 `fixed acidity` - 0.064 density
##            - 0.036 `total sulfur dioxide` - 0.031 `volatile acidity`
##            + 0.028 pH - 0.026 chlorides
## 
##   Rule 27/2: [88 cases, mean 5.5, range 4 to 8, est err 0.6]
## 
##     if
##  `total sulfur dioxide` > 0.05019546
##  sulphates > 0.2809896
##     then
##  outcome = 5.4 + 0.152 pH - 0.124 `free sulfur dioxide`
##            + 0.086 `citric acid` + 0.032 sulphates
##            + 0.022 `fixed acidity` - 0.022 `total sulfur dioxide`
##            - 0.019 `volatile acidity` - 0.016 chlorides
## 
##   Rule 27/3: [182 cases, mean 6.2, range 3 to 8, est err 0.6]
## 
##     if
##  `total sulfur dioxide` <= 0.05019546
##  sulphates > 0.2809896
##     then
##  outcome = 6.7 + 0.818 `total sulfur dioxide` + 0.457 pH
##            + 0.456 `citric acid` - 0.245 sulphates
##            - 0.077 `free sulfur dioxide`
## 
##   Rule 27/4: [133 cases, mean 6.3, range 5 to 8, est err 0.8]
## 
##     if
##  `volatile acidity` <= -1.110558
##     then
##  outcome = 6.2 + 0.521 `citric acid` - 0.202 pH
##            - 0.038 `free sulfur dioxide` - 0.029 `volatile acidity`
##            - 0.011 chlorides
## 
## Model 28:
## 
##   Rule 28/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.8 - 0.286 `citric acid` - 0.275 alcohol
##            - 0.233 `volatile acidity` + 0.164 `fixed acidity`
##            - 0.1 `total sulfur dioxide` - 0.046 pH
##            + 0.031 `free sulfur dioxide`
## 
##   Rule 28/2: [522 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.7 + 0.579 alcohol - 0.421 pH - 0.365 `total sulfur dioxide`
##            - 0.335 `fixed acidity` + 0.257 `free sulfur dioxide`
##            + 0.211 sulphates - 0.129 `volatile acidity`
## 
## Model 29:
## 
##   Rule 29/1: [657 cases, mean 5.4, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.06266046
##     then
##  outcome = 5.6 + 0.654 sulphates + 0.052 `fixed acidity` + 0.046 pH
##            - 0.044 `volatile acidity` - 0.022 `free sulfur dioxide`
##            - 0.013 density
## 
##   Rule 29/2: [343 cases, mean 5.9, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > 0.06266046
##     then
##  outcome = 5.8 - 0.295 `total sulfur dioxide` + 0.09 `citric acid`
##            + 0.052 `fixed acidity` + 0.046 pH - 0.044 `volatile acidity`
##            + 0.035 sulphates - 0.022 `free sulfur dioxide`
##            - 0.013 density
## 
## Model 30:
## 
##   Rule 30/1: [478 cases, mean 5.3, range 3 to 8, est err 0.5]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 5 - 0.316 `citric acid` - 0.296 `volatile acidity`
##            + 0.223 `fixed acidity` + 0.096 alcohol
##            - 0.03 `total sulfur dioxide` - 0.028 pH - 0.019 chlorides
##            + 0.019 `free sulfur dioxide`
## 
##   Rule 30/2: [32 cases, mean 5.3, range 3 to 7, est err 0.9]
## 
##     if
##  `volatile acidity` > -0.1584431
##  `free sulfur dioxide` <= -1.019859
##  alcohol > -0.4265552
##     then
##  outcome = -7.9 - 13.15 `free sulfur dioxide` - 0.886 `volatile acidity`
##            + 0.037 alcohol - 0.023 `fixed acidity` - 0.023 pH
## 
##   Rule 30/3: [522 cases, mean 5.4, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` > -0.1584431
##     then
##  outcome = 6.1 + 0.617 alcohol - 0.435 pH - 0.372 `fixed acidity`
##            - 0.27 `total sulfur dioxide` - 0.233 `volatile acidity`
##            + 0.164 `free sulfur dioxide` + 0.101 sulphates
## 
##   Rule 30/4: [522 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.5 + 0.606 alcohol - 0.557 `volatile acidity` - 0.364 pH
##            - 0.166 `fixed acidity` - 0.134 `total sulfur dioxide`
##            + 0.081 `free sulfur dioxide` + 0.05 sulphates
## 
## Model 31:
## 
##   Rule 31/1: [26 cases, mean 5.0, range 4 to 6, est err 0.7]
## 
##     if
##  `total sulfur dioxide` > 1.671341
##  sulphates > 0.06266046
##     then
##  outcome = 4.3 - 0.527 alcohol + 0.269 `citric acid`
##            + 0.195 `volatile acidity` + 0.146 sulphates
##            - 0.021 `total sulfur dioxide` + 0.014 pH
##            + 0.011 `fixed acidity`
## 
##   Rule 31/2: [657 cases, mean 5.4, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.06266046
##     then
##  outcome = 5.6 + 0.669 sulphates + 0.096 `free sulfur dioxide`
##            - 0.095 `total sulfur dioxide`
## 
##   Rule 31/3: [84 cases, mean 5.6, range 3 to 7, est err 0.8]
## 
##     if
##  chlorides > 0.0726212
##  `total sulfur dioxide` <= 1.671341
##  sulphates > 0.06266046
##     then
##  outcome = 5.3 - 0.431 `free sulfur dioxide` - 0.43 `fixed acidity`
##            + 0.406 `citric acid` - 0.235 sulphates
## 
##   Rule 31/4: [50 cases, mean 5.9, range 4 to 8, est err 0.9]
## 
##     if
##  `citric acid` <= -0.972158
##  sulphates > 0.06266046
##     then
##  outcome = 10.4 + 2.558 `citric acid` + 1.003 `fixed acidity`
##            + 0.545 alcohol + 0.036 chlorides + 0.027 pH
##            - 0.022 `total sulfur dioxide` + 0.009 `residual sugar`
## 
##   Rule 31/5: [13 cases, mean 6.1, range 4 to 7, est err 1.5]
## 
##     if
##  `citric acid` > 1.775745
##  chlorides > 0.0726212
##  sulphates > 0.06266046
##     then
##  outcome = 10 - 2.025 `citric acid` - 1.238 `total sulfur dioxide`
##            - 0.772 `volatile acidity`
## 
##   Rule 31/6: [203 cases, mean 6.1, range 4 to 8, est err 0.6]
## 
##     if
##  `citric acid` > -0.972158
##  chlorides <= 0.0726212
##  sulphates > 0.06266046
##     then
##  outcome = 6.1 + 0.736 chlorides - 0.465 `total sulfur dioxide` + 0.33 pH
##            - 0.213 `volatile acidity` + 0.213 density
##            + 0.097 `fixed acidity` + 0.04 `residual sugar`
##            + 0.029 alcohol
## 
## Model 32:
## 
##   Rule 32/1: [391 cases, mean 5.2, range 3 to 7, est err 0.4]
## 
##     if
##  alcohol <= -0.6201359
##     then
##  outcome = 4.7 - 0.419 alcohol - 0.238 `citric acid`
##            - 0.23 `volatile acidity` + 0.151 `fixed acidity` - 0.047 pH
##            - 0.019 `total sulfur dioxide`
## 
##   Rule 32/2: [609 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  alcohol > -0.6201359
##     then
##  outcome = 5.7 + 0.547 alcohol - 0.33 pH - 0.288 `volatile acidity`
##            - 0.154 density - 0.018 `citric acid`
##            - 0.012 `total sulfur dioxide`
## 
## Model 33:
## 
##   Rule 33/1: [59 cases, mean 5.1, range 4 to 6, est err 0.3]
## 
##     if
##  `total sulfur dioxide` > 1.971553
##     then
##  outcome = 5 + 0.223 `volatile acidity` + 0.213 `citric acid`
##            + 0.073 `residual sugar` + 0.034 sulphates
## 
##   Rule 33/2: [380 cases, mean 5.2, range 3 to 7, est err 0.4]
## 
##     if
##  sulphates <= 0.06266046
##  alcohol <= -0.3297648
##     then
##  outcome = 5.3 + 0.42 sulphates + 0.115 pH - 0.11 `total sulfur dioxide`
##            + 0.061 `fixed acidity` - 0.05 `volatile acidity`
##            + 0.021 `free sulfur dioxide`
## 
##   Rule 33/3: [23 cases, mean 5.3, range 3 to 6, est err 1.3]
## 
##     if
##  `total sulfur dioxide` <= 1.971553
##  sulphates <= 0.06266046
##  alcohol <= -1.200878
##     then
##  outcome = 18.3 + 9.192 alcohol + 2.949 sulphates - 1.199 `citric acid`
##            + 0.849 `fixed acidity`
## 
##   Rule 33/4: [272 cases, mean 5.7, range 3 to 8, est err 0.7]
## 
##     if
##  `total sulfur dioxide` <= 1.971553
##  sulphates <= 0.06266046
##  alcohol > -0.3297648
##     then
##  outcome = 5.8 + 0.969 sulphates + 0.42 `free sulfur dioxide`
##            - 0.368 `total sulfur dioxide`
## 
##   Rule 33/5: [343 cases, mean 5.9, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > 0.06266046
##     then
##  outcome = 5.9 - 0.376 `total sulfur dioxide` + 0.044 sulphates
##            + 0.042 pH + 0.022 `fixed acidity` - 0.018 `volatile acidity`
## 
## Model 34:
## 
##   Rule 34/1: [391 cases, mean 5.2, range 3 to 7, est err 0.4]
## 
##     if
##  alcohol <= -0.6201359
##     then
##  outcome = 5.3 + 0.309 alcohol - 0.172 `volatile acidity` - 0.097 pH
##            - 0.072 chlorides - 0.063 `citric acid`
## 
##   Rule 34/2: [609 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  alcohol > -0.6201359
##     then
##  outcome = 5.7 + 0.54 alcohol - 0.308 pH - 0.296 `volatile acidity`
##            - 0.102 `fixed acidity` - 0.1 density - 0.018 chlorides
##            - 0.015 `citric acid`
## 
## Model 35:
## 
##   Rule 35/1: [237 cases, mean 5.3, range 4 to 8, est err 0.4]
## 
##     if
##  `total sulfur dioxide` > 0.5305347
##     then
##  outcome = 5.1 - 0.067 `total sulfur dioxide` + 0.057 sulphates + 0.04 pH
##            + 0.037 `fixed acidity` + 0.022 `free sulfur dioxide`
## 
##   Rule 35/2: [548 cases, mean 5.5, range 3 to 8, est err 0.6]
## 
##     if
##  `total sulfur dioxide` <= 0.5305347
##  sulphates <= 0.2809896
##     then
##  outcome = 5.8 + 0.917 sulphates - 0.067 `total sulfur dioxide`
##            + 0.042 `free sulfur dioxide`
## 
##   Rule 35/3: [270 cases, mean 6.0, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > 0.2809896
##     then
##  outcome = 5.8 - 0.411 `total sulfur dioxide` + 0.221 pH
##            + 0.181 `citric acid`
## 
##   Rule 35/4: [133 cases, mean 6.3, range 5 to 8, est err 0.8]
## 
##     if
##  `volatile acidity` <= -1.110558
##     then
##  outcome = 6.2 + 0.666 `citric acid` - 0.065 `total sulfur dioxide`
##            + 0.042 pH
## 
## Model 36:
## 
##   Rule 36/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.9 - 0.232 `citric acid` - 0.215 `volatile acidity`
##            - 0.199 alcohol + 0.198 `fixed acidity` - 0.021 pH
## 
##   Rule 36/2: [522 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.7 + 0.623 alcohol - 0.455 pH - 0.342 `fixed acidity`
##            - 0.152 `total sulfur dioxide` - 0.151 `volatile acidity`
##            + 0.149 sulphates + 0.132 `free sulfur dioxide`
## 
## Model 37:
## 
##   Rule 37/1: [788 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.4993187
##     then
##  outcome = 5.7 + 0.762 sulphates - 0.175 `total sulfur dioxide`
##            - 0.112 density + 0.096 `fixed acidity`
##            + 0.085 `free sulfur dioxide` + 0.015 pH
##            - 0.014 `volatile acidity`
## 
##   Rule 37/2: [212 cases, mean 5.9, range 3 to 8, est err 0.8]
## 
##     if
##  sulphates > 0.4993187
##     then
##  outcome = 5.7 - 0.377 `free sulfur dioxide` + 0.309 pH + 0.15 density
## 
##   Rule 37/3: [133 cases, mean 6.3, range 5 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` <= -1.110558
##     then
##  outcome = 6.4 - 0.163 `volatile acidity` + 0.125 pH
##            - 0.112 `free sulfur dioxide` - 0.108 `total sulfur dioxide`
##            + 0.047 `fixed acidity` + 0.045 density + 0.042 sulphates
## 
## Model 38:
## 
##   Rule 38/1: [391 cases, mean 5.2, range 3 to 7, est err 0.4]
## 
##     if
##  alcohol <= -0.6201359
##     then
##  outcome = 4.6 - 0.551 alcohol - 0.249 `citric acid`
##            + 0.2 `fixed acidity` - 0.18 `volatile acidity` - 0.031 pH
## 
##   Rule 38/2: [609 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  alcohol > -0.6201359
##     then
##  outcome = 5.7 + 0.628 alcohol - 0.443 pH - 0.288 `fixed acidity`
##            - 0.211 `total sulfur dioxide` - 0.194 `volatile acidity`
##            + 0.175 `free sulfur dioxide` + 0.157 sulphates
## 
## Model 39:
## 
##   Rule 39/1: [804 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.553901
##     then
##  outcome = 5.6 + 0.677 sulphates - 0.12 `total sulfur dioxide`
##            - 0.085 density + 0.067 `fixed acidity` + 0.031 pH
##            - 0.025 `volatile acidity`
## 
##   Rule 39/2: [121 cases, mean 5.6, range 3 to 7, est err 0.6]
## 
##     if
##  `volatile acidity` > -1.110558
##  sulphates > 0.553901
##  alcohol <= 1.799623
##     then
##  outcome = 5.5 - 0.256 `total sulfur dioxide` + 0.16 density
##            - 0.155 `free sulfur dioxide` + 0.11 pH
## 
##   Rule 39/3: [133 cases, mean 6.3, range 5 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` <= -1.110558
##     then
##  outcome = 6.2 - 0.142 `free sulfur dioxide` + 0.111 pH
##            - 0.107 `volatile acidity` - 0.085 `total sulfur dioxide`
##            + 0.066 density
## 
##   Rule 39/4: [63 cases, mean 6.5, range 4 to 8, est err 0.9]
## 
##     if
##  alcohol > 1.799623
##     then
##  outcome = 10.4 - 1.661 alcohol - 0.073 `free sulfur dioxide` + 0.051 pH
## 
## Model 40:
## 
##   Rule 40/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.9 - 0.251 `citric acid` - 0.245 `volatile acidity`
##            - 0.228 alcohol + 0.197 `fixed acidity` - 0.043 pH
##            + 0.026 `free sulfur dioxide` - 0.023 `total sulfur dioxide`
## 
##   Rule 40/2: [522 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.7 + 0.599 alcohol - 0.482 pH - 0.321 `fixed acidity`
##            - 0.281 `total sulfur dioxide` + 0.242 `free sulfur dioxide`
##            + 0.221 sulphates - 0.156 `volatile acidity`
## 
## Model 41:
## 
##   Rule 41/1: [788 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.4993187
##     then
##  outcome = 5.7 + 0.75 sulphates - 0.116 `total sulfur dioxide`
##            - 0.084 density + 0.018 pH - 0.015 `volatile acidity`
##            + 0.012 `fixed acidity`
## 
##   Rule 41/2: [212 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  sulphates > 0.4993187
##     then
##  outcome = 5.8 - 0.416 `free sulfur dioxide` + 0.29 pH
##            - 0.286 `volatile acidity` + 0.143 `fixed acidity`
## 
## Model 42:
## 
##   Rule 42/1: [428 cases, mean 5.3, range 3 to 7, est err 0.4]
## 
##     if
##  alcohol <= -0.5233455
##     then
##  outcome = 4.7 - 0.396 alcohol - 0.224 `citric acid`
##            - 0.213 `volatile acidity` + 0.21 `fixed acidity`
##            + 0.026 `free sulfur dioxide` - 0.024 `total sulfur dioxide`
##            - 0.022 pH
## 
##   Rule 42/2: [572 cases, mean 5.8, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.5233455
##     then
##  outcome = 5.7 + 0.633 alcohol - 0.502 pH - 0.29 `total sulfur dioxide`
##            - 0.284 `fixed acidity` - 0.249 `volatile acidity`
##            + 0.249 `free sulfur dioxide`
## 
## Model 43:
## 
##   Rule 43/1: [730 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.2809896
##     then
##  outcome = 5.6 + 0.71 sulphates - 0.083 `total sulfur dioxide`
## 
##   Rule 43/2: [108 cases, mean 5.6, range 4 to 7, est err 0.7]
## 
##     if
##  `fixed acidity` <= -0.07018395
##  sulphates > 0.2809896
##  alcohol <= 2.283575
##     then
##  outcome = 5.6 + 0.435 density - 0.426 `total sulfur dioxide`
##            - 0.069 `free sulfur dioxide` + 0.063 pH + 0.046 alcohol
##            + 0.017 sulphates + 0.01 `fixed acidity`
## 
##   Rule 43/3: [12 cases, mean 5.8, range 5 to 7, est err 3.8]
## 
##     if
##  `fixed acidity` > 2.162199
##  `volatile acidity` > -1.110558
##  sulphates > 0.2809896
##     then
##  outcome = 13 - 4.631 chlorides - 2.338 `fixed acidity` - 0.521 sulphates
##            + 0.374 `volatile acidity` - 0.258 alcohol
## 
##   Rule 43/4: [31 cases, mean 6.0, range 5 to 8, est err 1.0]
## 
##     if
##  `free sulfur dioxide` <= -1.019859
##  sulphates > 0.2809896
##     then
##  outcome = 6.2 - 0.662 `citric acid` - 0.044 `free sulfur dioxide`
##            + 0.036 pH + 0.02 alcohol + 0.013 density
## 
##   Rule 43/5: [132 cases, mean 6.2, range 3 to 8, est err 0.7]
## 
##     if
##  `fixed acidity` > -0.07018395
##  `free sulfur dioxide` > -1.019859
##  sulphates > 0.2809896
##     then
##  outcome = 6.4 + 0.603 alcohol - 0.485 `citric acid`
##            - 0.317 `free sulfur dioxide`
## 
##   Rule 43/6: [133 cases, mean 6.3, range 5 to 8, est err 0.8]
## 
##     if
##  `volatile acidity` <= -1.110558
##     then
##  outcome = 6.3 + 0.547 `citric acid` - 0.075 `free sulfur dioxide`
##            - 0.06 `volatile acidity` + 0.055 pH
## 
##   Rule 43/7: [14 cases, mean 6.9, range 6 to 8, est err 2.4]
## 
##     if
##  `fixed acidity` <= 2.162199
##  sulphates > 0.2809896
##  alcohol > 2.283575
##     then
##  outcome = 18.3 - 4.384 alcohol + 3.294 pH + 2.107 `fixed acidity`
##            - 0.757 `free sulfur dioxide`
## 
## Model 44:
## 
##   Rule 44/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.9 - 0.249 alcohol - 0.246 `volatile acidity`
##            - 0.212 `citric acid` + 0.188 `fixed acidity`
##            - 0.043 `total sulfur dioxide` + 0.038 `free sulfur dioxide`
##            - 0.025 pH
## 
##   Rule 44/2: [522 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.8 + 0.537 alcohol - 0.448 pH - 0.346 `total sulfur dioxide`
##            - 0.322 `fixed acidity` + 0.269 `free sulfur dioxide`
##            - 0.211 `volatile acidity`
## 
## Model 45:
## 
##   Rule 45/1: [804 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.553901
##     then
##  outcome = 5.7 + 0.806 sulphates - 0.1 density
##            - 0.076 `total sulfur dioxide` + 0.075 `fixed acidity`
##            + 0.018 pH - 0.012 `volatile acidity`
##            - 0.01 `free sulfur dioxide` - 0.009 chlorides
## 
##   Rule 45/2: [196 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  sulphates > 0.553901
##     then
##  outcome = 5.8 - 0.37 `free sulfur dioxide` - 0.215 `volatile acidity`
##            + 0.186 pH + 0.077 density + 0.043 sulphates
##            + 0.029 `fixed acidity` - 0.014 chlorides
##            - 0.01 `total sulfur dioxide`
## 
## Model 46:
## 
##   Rule 46/1: [428 cases, mean 5.3, range 3 to 7, est err 0.4]
## 
##     if
##  alcohol <= -0.5233455
##     then
##  outcome = 4.7 - 0.465 alcohol + 0.266 `fixed acidity`
##            - 0.235 `volatile acidity` - 0.223 `citric acid` + 0.11 pH
##            - 0.035 `total sulfur dioxide` + 0.03 `free sulfur dioxide`
## 
##   Rule 46/2: [34 cases, mean 5.4, range 3 to 7, est err 0.9]
## 
##     if
##  `volatile acidity` > -0.1584431
##  `free sulfur dioxide` <= -1.019859
##  alcohol > -0.5233455
##     then
##  outcome = -7.7 - 12.924 `free sulfur dioxide` - 0.938 `volatile acidity`
## 
##   Rule 46/3: [522 cases, mean 5.4, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` > -0.1584431
##     then
##  outcome = 6 + 0.644 alcohol - 0.397 pH - 0.305 `volatile acidity`
##            - 0.262 `fixed acidity` - 0.245 `total sulfur dioxide`
##            + 0.183 `free sulfur dioxide`
## 
##   Rule 46/4: [41 cases, mean 5.7, range 4 to 8, est err 1.0]
## 
##     if
##  `volatile acidity` > -0.1584431
##  `free sulfur dioxide` > -1.019859
##  pH > 1.33525
##  alcohol > -0.5233455
##     then
##  outcome = 10.1 + 2.644 `fixed acidity` - 1.225 pH + 0.991 alcohol
##            - 0.951 density
## 
##   Rule 46/5: [309 cases, mean 6.0, range 3 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` <= -0.1584431
##  alcohol > -0.5233455
##     then
##  outcome = 5.2 - 0.76 `volatile acidity` - 0.587 pH + 0.58 alcohol
##            - 0.368 `total sulfur dioxide` - 0.287 `fixed acidity`
##            + 0.226 `free sulfur dioxide`
## 
## Model 47:
## 
##   Rule 47/1: [730 cases, mean 5.5, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates <= 0.2809896
##     then
##  outcome = 5.5 + 0.669 sulphates - 0.069 `total sulfur dioxide` + 0.03 pH
##            - 0.021 `volatile acidity` + 0.02 `fixed acidity`
##            - 0.011 `free sulfur dioxide`
## 
##   Rule 47/2: [270 cases, mean 6.0, range 3 to 8, est err 0.7]
## 
##     if
##  sulphates > 0.2809896
##     then
##  outcome = 5.9 + 0.326 pH - 0.304 `free sulfur dioxide`
##            - 0.235 `volatile acidity` + 0.178 `citric acid`
## 
## Model 48:
## 
##   Rule 48/1: [230 cases, mean 5.3, range 4 to 8, est err 0.4]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` > 0.05019546
##     then
##  outcome = 5.7 + 0.47 alcohol + 0.434 `fixed acidity` - 0.287 density
##            - 0.278 `volatile acidity` - 0.097 `citric acid`
##            + 0.095 `residual sugar` - 0.036 pH
##            + 0.035 `free sulfur dioxide` - 0.034 `total sulfur dioxide`
## 
##   Rule 48/2: [591 cases, mean 5.4, range 3 to 8, est err 0.5]
## 
##     if
##  `volatile acidity` > -0.3264634
##     then
##  outcome = 5.4 + 0.67 alcohol + 0.033 density
## 
##   Rule 48/3: [308 cases, mean 5.7, range 3 to 8, est err 0.7]
## 
##     if
##  `total sulfur dioxide` <= 0.05019546
##  pH > 0.005698082
##     then
##  outcome = 6.8 - 0.778 pH + 0.667 `total sulfur dioxide` + 0.467 alcohol
##            - 0.423 `citric acid` - 0.34 `volatile acidity`
##            + 0.329 sulphates + 0.014 `fixed acidity`
## 
##   Rule 48/4: [409 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` <= -0.3264634
##     then
##  outcome = 5 - 0.737 `volatile acidity` + 0.523 alcohol - 0.254 pH
##            + 0.077 `fixed acidity` - 0.069 `citric acid` - 0.043 density
##            + 0.033 `free sulfur dioxide` - 0.032 `total sulfur dioxide`
## 
##   Rule 48/5: [45 cases, mean 5.9, range 5 to 7, est err 0.8]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `volatile acidity` <= 0.0935873
##  `total sulfur dioxide` <= 0.05019546
##  pH <= 0.005698082
##     then
##  outcome = 8.1 + 2.85 `volatile acidity` + 1.796 `total sulfur dioxide`
##            + 0.714 alcohol + 0.013 `fixed acidity` - 0.013 `citric acid`
## 
##   Rule 48/6: [121 cases, mean 6.5, range 4 to 8, est err 1.3]
## 
##     if
##  alcohol > 1.218881
##     then
##  outcome = 8.1 - 0.509 alcohol - 0.495 chlorides - 0.495 density
##            + 0.394 `volatile acidity` - 0.35 pH
##            - 0.349 `total sulfur dioxide` + 0.341 `residual sugar`
## 
## Model 49:
## 
##   Rule 49/1: [730 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.2809896
##     then
##  outcome = 5.5 + 0.587 sulphates - 0.115 `total sulfur dioxide`
##            - 0.033 `volatile acidity` - 0.028 chlorides
## 
##   Rule 49/2: [12 cases, mean 5.8, range 5 to 7, est err 2.8]
## 
##     if
##  `fixed acidity` > 2.162199
##  `volatile acidity` > -1.110558
##  sulphates > 0.2809896
##     then
##  outcome = 13.2 - 5.453 chlorides - 2.328 `fixed acidity`
##            - 1.114 sulphates + 0.333 `volatile acidity`
## 
##   Rule 49/3: [270 cases, mean 6.0, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > 0.2809896
##     then
##  outcome = 5.7 + 0.232 pH + 0.194 alcohol - 0.186 `free sulfur dioxide`
##            + 0.121 `fixed acidity`
## 
##   Rule 49/4: [133 cases, mean 6.3, range 5 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` <= -1.110558
##     then
##  outcome = 5.7 + 0.898 `citric acid` + 0.275 alcohol
## 
## Model 50:
## 
##   Rule 50/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.9 - 0.269 `volatile acidity` - 0.249 `citric acid`
##            - 0.24 alcohol + 0.181 `fixed acidity` - 0.05 pH
##            - 0.04 `total sulfur dioxide` + 0.031 `free sulfur dioxide`
## 
##   Rule 50/2: [522 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.9 + 0.559 alcohol - 0.427 pH - 0.311 `total sulfur dioxide`
##            - 0.282 `fixed acidity` + 0.217 `free sulfur dioxide`
##            - 0.155 `volatile acidity` + 0.145 sulphates
## 
## Model 51:
## 
##   Rule 51/1: [26 cases, mean 5.0, range 4 to 6, est err 0.7]
## 
##     if
##  `total sulfur dioxide` > 1.671341
##  sulphates > 0.06266046
##     then
##  outcome = 4.6 - 0.603 alcohol + 0.205 `volatile acidity`
##            - 0.046 `total sulfur dioxide` + 0.036 sulphates
## 
##   Rule 51/2: [133 cases, mean 5.4, range 3 to 7, est err 0.6]
## 
##     if
##  `fixed acidity` <= 2.053303
##  `volatile acidity` > -0.6064972
##  chlorides > 0.05258777
##  `total sulfur dioxide` <= 1.671341
##  density > -1.225798
##     then
##  outcome = 5.1 - 0.291 `total sulfur dioxide` + 0.067 pH
##            + 0.053 `citric acid` - 0.045 `free sulfur dioxide`
## 
##   Rule 51/3: [657 cases, mean 5.4, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.06266046
##     then
##  outcome = 5.5 + 0.633 sulphates - 0.028 `volatile acidity`
##            - 0.026 `total sulfur dioxide`
## 
##   Rule 51/4: [121 cases, mean 5.9, range 4 to 8, est err 0.8]
## 
##     if
##  `volatile acidity` > -0.6064972
##  chlorides <= 0.05258777
##  sulphates > 0.06266046
##     then
##  outcome = 6.8 + 2.035 chlorides - 0.991 `total sulfur dioxide`
##            + 0.725 `fixed acidity` + 0.655 pH - 0.636 sulphates
##            - 0.537 density + 0.426 `free sulfur dioxide`
##            + 0.281 `residual sugar`
## 
##   Rule 51/5: [343 cases, mean 5.9, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > 0.06266046
##     then
##  outcome = 5.9 - 0.214 `total sulfur dioxide` + 0.089 pH
##            - 0.081 `volatile acidity` - 0.079 `free sulfur dioxide`
##            + 0.07 alcohol + 0.055 density
## 
##   Rule 51/6: [20 cases, mean 6.2, range 5 to 8, est err 1.3]
## 
##     if
##  `fixed acidity` > 2.053303
##  sulphates > 0.06266046
##     then
##  outcome = 10.8 - 1.637 `fixed acidity` - 0.873 alcohol + 0.009 pH
## 
##   Rule 51/7: [18 cases, mean 6.3, range 5 to 8, est err 1.4]
## 
##     if
##  `volatile acidity` > -0.6064972
##  density <= -1.225798
##  sulphates > 0.06266046
##     then
##  outcome = 4 + 1.843 pH
## 
## Model 52:
## 
##   Rule 52/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 5.1 - 0.298 `volatile acidity` - 0.283 `citric acid`
##            + 0.236 `fixed acidity` + 0.039 alcohol - 0.013 pH
## 
##   Rule 52/2: [522 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.8 + 0.619 alcohol - 0.52 pH - 0.354 `fixed acidity`
##            - 0.232 `total sulfur dioxide` - 0.223 `volatile acidity`
##            + 0.16 `free sulfur dioxide` + 0.087 sulphates
## 
## Model 53:
## 
##   Rule 53/1: [730 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.2809896
##     then
##  outcome = 5.6 + 0.679 sulphates - 0.077 `total sulfur dioxide`
## 
##   Rule 53/2: [270 cases, mean 6.0, range 3 to 8, est err 0.7]
## 
##     if
##  sulphates > 0.2809896
##     then
##  outcome = 5.7 + 0.357 pH - 0.278 `free sulfur dioxide`
##            + 0.143 `citric acid` - 0.027 `total sulfur dioxide`
## 
##   Rule 53/3: [133 cases, mean 6.3, range 5 to 8, est err 0.8]
## 
##     if
##  `volatile acidity` <= -1.110558
##     then
##  outcome = 6.2 + 0.765 `citric acid` - 0.032 `total sulfur dioxide`
##            + 0.025 pH
## 
## Model 54:
## 
##   Rule 54/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.9 - 0.282 `citric acid` - 0.263 `volatile acidity`
##            - 0.213 alcohol + 0.205 `fixed acidity` - 0.064 pH
##            - 0.049 `total sulfur dioxide` + 0.042 `free sulfur dioxide`
## 
##   Rule 54/2: [166 cases, mean 5.7, range 3 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` > 0.1215907
##  pH > -1.007294
##  alcohol > -0.4265552
##     then
##  outcome = 6.2 + 0.95 alcohol - 0.532 `volatile acidity` - 0.349 pH
##            - 0.077 `total sulfur dioxide` + 0.061 `free sulfur dioxide`
##            - 0.03 `citric acid` - 0.029 `fixed acidity` + 0.019 sulphates
## 
##   Rule 54/3: [43 cases, mean 5.7, range 3 to 7, est err 0.9]
## 
##     if
##  `volatile acidity` <= 0.1215907
##  chlorides > 0.1327215
##  pH > -1.007294
##  alcohol > -0.4265552
##     then
##  outcome = 5.2 - 1.824 pH + 1.078 `total sulfur dioxide`
##            - 1.058 `free sulfur dioxide` - 0.688 density
##            + 0.392 sulphates + 0.009 alcohol
## 
##   Rule 54/4: [522 cases, mean 5.9, range 3 to 8, est err 1.1]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.1 - 0.868 pH + 0.776 `citric acid` - 0.732 `fixed acidity`
##            + 0.13 alcohol - 0.073 `total sulfur dioxide`
##            + 0.055 `free sulfur dioxide` + 0.041 sulphates
##            - 0.027 `volatile acidity`
## 
##   Rule 54/5: [380 cases, mean 6.0, range 3 to 8, est err 0.7]
## 
##     if
##  chlorides <= 0.1327215
##  pH > -1.007294
##  alcohol > -0.4265552
##     then
##  outcome = 5.9 - 0.53 `total sulfur dioxide` + 0.489 alcohol
##            + 0.393 `fixed acidity` - 0.361 pH
##            + 0.345 `free sulfur dioxide` - 0.275 density
##            + 0.224 `residual sugar` - 0.035 `volatile acidity`
## 
## Model 55:
## 
##   Rule 55/1: [749 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.3355719
##     then
##  outcome = 5.7 + 0.643 sulphates + 0.233 alcohol - 0.139 `citric acid`
##            + 0.069 pH - 0.059 `volatile acidity` + 0.042 `fixed acidity`
##            - 0.033 `total sulfur dioxide`
## 
##   Rule 55/2: [251 cases, mean 6.0, range 3 to 8, est err 0.7]
## 
##     if
##  sulphates > 0.3355719
##     then
##  outcome = 6.1 + 0.502 pH - 0.325 `volatile acidity`
##            - 0.241 `free sulfur dioxide` + 0.221 alcohol
##            + 0.133 `fixed acidity` + 0.026 sulphates
##            - 0.019 `citric acid` - 0.015 `total sulfur dioxide`
## 
## Model 56:
## 
##   Rule 56/1: [879 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  alcohol <= 1.218881
##     then
##  outcome = 5.4 - 0.211 `volatile acidity` + 0.205 alcohol - 0.205 pH
##            - 0.176 `total sulfur dioxide` + 0.13 `fixed acidity`
##            - 0.126 density + 0.11 `free sulfur dioxide`
## 
##   Rule 56/2: [121 cases, mean 6.5, range 4 to 8, est err 0.8]
## 
##     if
##  alcohol > 1.218881
##     then
##  outcome = 7.6 - 0.969 `fixed acidity` - 0.882 pH - 0.734 chlorides
##            - 0.483 alcohol - 0.481 `total sulfur dioxide`
##            + 0.396 `volatile acidity` + 0.279 `citric acid`
##            + 0.247 `residual sugar`
## 
## Model 57:
## 
##   Rule 57/1: [405 cases, mean 5.2, range 3 to 7, est err 0.4]
## 
##     if
##  sulphates <= 0.2809896
##  alcohol <= -0.3297648
##     then
##  outcome = 5.4 + 0.482 sulphates - 0.221 `citric acid` + 0.117 pH
##            + 0.106 alcohol + 0.101 `fixed acidity`
##            - 0.091 `volatile acidity` - 0.032 `free sulfur dioxide`
## 
##   Rule 57/2: [25 cases, mean 5.3, range 3 to 6, est err 1.4]
## 
##     if
##  sulphates <= 0.2809896
##  alcohol <= -1.200878
##     then
##  outcome = 18.4 + 9.325 alcohol + 2.311 sulphates - 1.14 `citric acid`
##            - 1.071 pH
## 
##   Rule 57/3: [325 cases, mean 5.7, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates <= 0.2809896
##  alcohol > -0.3297648
##     then
##  outcome = 6.2 + 0.917 sulphates + 0.144 `free sulfur dioxide`
##            - 0.133 `total sulfur dioxide` + 0.06 alcohol
##            - 0.038 `citric acid`
## 
##   Rule 57/4: [119 cases, mean 5.9, range 3 to 8, est err 0.8]
## 
##     if
##  `total sulfur dioxide` <= 0.2003015
##  sulphates > 0.2809896
##  alcohol <= 0.5413485
##     then
##  outcome = 6.5 + 0.9 `residual sugar` + 0.466 alcohol + 0.346 pH
##            + 0.049 density - 0.032 `citric acid`
##            - 0.027 `free sulfur dioxide`
## 
##   Rule 57/5: [270 cases, mean 6.0, range 3 to 8, est err 0.8]
## 
##     if
##  sulphates > 0.2809896
##     then
##  outcome = 5.1 + 0.276 alcohol - 0.19 `citric acid` + 0.142 pH
##            + 0.141 density - 0.119 `free sulfur dioxide`
##            + 0.118 `fixed acidity` - 0.105 `volatile acidity`
##            + 0.103 sulphates
## 
##   Rule 57/6: [72 cases, mean 6.2, range 5 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` > -1.110558
##  sulphates > 0.2809896
##  alcohol > 0.5413485
##     then
##  outcome = 5.7 + 0.459 pH + 0.409 alcohol - 0.072 `free sulfur dioxide`
##            + 0.027 `fixed acidity`
## 
##   Rule 57/7: [133 cases, mean 6.3, range 5 to 8, est err 0.8]
## 
##     if
##  `volatile acidity` <= -1.110558
##     then
##  outcome = 6.3 + 0.593 alcohol + 0.465 `citric acid` + 0.239 density
##            - 0.033 `volatile acidity` + 0.028 pH
##            - 0.021 `free sulfur dioxide`
## 
## Model 58:
## 
##   Rule 58/1: [1000 cases, mean 5.6, range 3 to 8, est err 0.5]
## 
##  outcome = 5.6 + 0.269 alcohol - 0.227 pH - 0.215 `volatile acidity`
##            - 0.194 `total sulfur dioxide` + 0.147 sulphates
##            - 0.105 density - 0.101 chlorides + 0.09 `free sulfur dioxide`
## 
## Model 59:
## 
##   Rule 59/1: [478 cases, mean 5.3, range 3 to 8, est err 0.5]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.9 + 0.324 pH + 0.255 `fixed acidity` - 0.238 alcohol
##            - 0.063 `volatile acidity` + 0.044 sulphates
##            - 0.041 `citric acid` - 0.037 `total sulfur dioxide`
## 
##   Rule 59/2: [804 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.553901
##     then
##  outcome = 6 + 0.863 sulphates + 0.291 alcohol
## 
##   Rule 59/3: [196 cases, mean 5.9, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > 0.553901
##     then
##  outcome = 5.5 + 0.308 alcohol + 0.164 pH + 0.148 `fixed acidity`
##            - 0.123 `volatile acidity` + 0.114 sulphates
##            - 0.079 `citric acid` - 0.072 `total sulfur dioxide`
## 
## Model 60:
## 
##   Rule 60/1: [350 cases, mean 5.3, range 4 to 8, est err 0.4]
## 
##     if
##  `total sulfur dioxide` > 0.05019546
##     then
##  outcome = 5.3 - 0.211 `volatile acidity` + 0.196 alcohol
##            + 0.165 `fixed acidity` - 0.131 pH - 0.128 `citric acid`
##            - 0.096 density - 0.055 `total sulfur dioxide`
## 
##   Rule 60/2: [650 cases, mean 5.7, range 3 to 8, est err 0.6]
## 
##     if
##  `total sulfur dioxide` <= 0.05019546
##     then
##  outcome = 5.7 - 0.406 `volatile acidity` + 0.388 alcohol
##            - 0.324 `citric acid` - 0.287 pH + 0.18 sulphates
## 
##   Rule 60/3: [409 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` <= -0.3264634
##     then
##  outcome = 4.9 - 0.781 `volatile acidity` - 0.257 pH + 0.246 alcohol
##            - 0.238 `total sulfur dioxide` - 0.046 density
##            + 0.041 sulphates - 0.03 chlorides + 0.019 `residual sugar`
##            + 0.018 `free sulfur dioxide` - 0.016 `citric acid`
## 
##   Rule 60/4: [86 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol > 0.6381389
##  alcohol <= 2.477156
##     then
##  outcome = 4 + 1.685 alcohol - 0.651 `volatile acidity`
##            + 0.335 `free sulfur dioxide` + 0.311 `citric acid`
##            - 0.276 `fixed acidity` - 0.067 pH - 0.06 density
## 
##   Rule 60/5: [12 cases, mean 6.1, range 4 to 8, est err 1.6]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol > 2.477156
##     then
##  outcome = 3.8 + 2.359 `volatile acidity` + 0.151 alcohol - 0.098 pH
##            - 0.088 density
## 
## Model 61:
## 
##   Rule 61/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.8 - 0.412 alcohol + 0.286 pH + 0.209 `fixed acidity`
##            + 0.047 sulphates + 0.041 `citric acid`
##            - 0.036 `total sulfur dioxide` - 0.032 chlorides
##            + 0.028 `free sulfur dioxide`
## 
##   Rule 61/2: [466 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  sulphates > -0.2102509
##     then
##  outcome = 6.2 + 0.265 alcohol - 0.192 `total sulfur dioxide`
##            + 0.05 sulphates + 0.035 `citric acid` - 0.027 chlorides
##            + 0.024 pH + 0.023 `free sulfur dioxide`
## 
##   Rule 61/3: [522 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.3 + 0.361 alcohol + 0.189 `free sulfur dioxide`
##            + 0.047 sulphates
## 
## Model 62:
## 
##   Rule 62/1: [350 cases, mean 5.3, range 4 to 8, est err 0.5]
## 
##     if
##  `total sulfur dioxide` > 0.05019546
##     then
##  outcome = 5.4 + 0.408 alcohol - 0.316 `volatile acidity` - 0.277 pH
##            - 0.144 sulphates - 0.036 `citric acid`
##            - 0.023 `total sulfur dioxide`
## 
##   Rule 62/2: [400 cases, mean 5.4, range 3 to 8, est err 0.6]
## 
##     if
##  pH <= 0.005698082
##  alcohol <= 0.5413485
##     then
##  outcome = 5.7 + 0.977 alcohol - 0.532 pH + 0.281 `residual sugar`
##            - 0.205 `fixed acidity` - 0.097 `volatile acidity`
##            - 0.071 `citric acid` + 0.021 sulphates
##            - 0.011 `total sulfur dioxide`
## 
##   Rule 62/3: [222 cases, mean 5.5, range 3 to 7, est err 0.6]
## 
##     if
##  `total sulfur dioxide` <= 0.05019546
##  pH > 0.005698082
##  alcohol <= 0.5413485
##     then
##  outcome = 6.4 - 0.89 pH + 0.613 alcohol + 0.581 sulphates
##            - 0.342 `fixed acidity` - 0.12 `volatile acidity`
##            - 0.098 `citric acid` + 0.058 `residual sugar`
## 
##   Rule 62/4: [99 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol > 0.5413485
##  alcohol <= 2.477156
##     then
##  outcome = 4.4 + 1.39 alcohol - 0.514 `volatile acidity` - 0.201 density
##            + 0.049 sulphates + 0.043 `fixed acidity`
## 
##   Rule 62/5: [409 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` <= -0.3264634
##     then
##  outcome = 4.9 - 0.913 `volatile acidity` + 0.327 alcohol
##            - 0.297 `total sulfur dioxide` - 0.213 pH
## 
##   Rule 62/6: [12 cases, mean 6.1, range 4 to 8, est err 1.6]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol > 2.477156
##     then
##  outcome = 3.9 + 2.367 `volatile acidity` - 0.048 density + 0.045 alcohol
##            + 0.044 sulphates + 0.039 `fixed acidity`
## 
## Model 63:
## 
##   Rule 63/1: [17 cases, mean 5.1, range 5 to 6, est err 0.4]
## 
##     if
##  `total sulfur dioxide` > 1.671341
##  sulphates > -0.2102509
##  alcohol > -0.6201359
##     then
##  outcome = 3 + 0.811 `total sulfur dioxide` + 0.056 alcohol
##            + 0.044 sulphates + 0.033 `free sulfur dioxide`
##            + 0.023 `citric acid`
## 
##   Rule 63/2: [391 cases, mean 5.2, range 3 to 7, est err 0.5]
## 
##     if
##  alcohol <= -0.6201359
##     then
##  outcome = 4.4 - 1 alcohol + 0.475 pH + 0.369 `fixed acidity`
##            + 0.133 sulphates - 0.024 `total sulfur dioxide`
##            - 0.021 chlorides + 0.018 `free sulfur dioxide`
##            - 0.015 `volatile acidity`
## 
##   Rule 63/3: [534 cases, mean 5.3, range 3 to 7, est err 0.5]
## 
##     if
##  sulphates <= -0.2102509
##     then
##  outcome = 5.2 + 0.273 alcohol + 0.232 `free sulfur dioxide`
## 
##   Rule 63/4: [434 cases, mean 5.9, range 3 to 8, est err 0.6]
## 
##     if
##  `total sulfur dioxide` <= 1.671341
##  sulphates > -0.2102509
##     then
##  outcome = 6 + 0.286 alcohol - 0.113 `total sulfur dioxide`
##            + 0.082 `citric acid` + 0.035 sulphates
##            + 0.026 `free sulfur dioxide`
## 
## Model 64:
## 
##   Rule 64/1: [324 cases, mean 5.3, range 4 to 7, est err 0.4]
## 
##     if
##  `total sulfur dioxide` > 0.05019546
##  alcohol <= 1.218881
##     then
##  outcome = 5.4 - 0.277 `volatile acidity` + 0.204 `fixed acidity`
##            + 0.148 alcohol - 0.131 density - 0.129 `citric acid`
##            - 0.101 pH - 0.075 `total sulfur dioxide`
##            - 0.027 `free sulfur dioxide`
## 
##   Rule 64/2: [480 cases, mean 5.3, range 3 to 7, est err 0.5]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol <= 0.5413485
##     then
##  outcome = 5.7 + 0.95 alcohol - 0.553 pH - 0.523 `fixed acidity`
##            + 0.419 density - 0.11 `volatile acidity`
## 
##   Rule 64/3: [26 cases, mean 5.3, range 4 to 7, est err 0.9]
## 
##     if
##  `fixed acidity` <= -1.104703
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  alcohol <= 1.218881
##     then
##  outcome = 4.7 - 1.603 density - 1.239 `volatile acidity` - 0.108 pH
##            + 0.063 sulphates + 0.052 alcohol - 0.049 `citric acid`
##            + 0.028 `residual sugar`
## 
##   Rule 64/4: [48 cases, mean 5.4, range 3 to 7, est err 0.7]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  alcohol > 0.5413485
##  alcohol <= 1.218881
##     then
##  outcome = 4.2 + 2.076 alcohol + 1.025 `total sulfur dioxide`
##            - 0.127 `volatile acidity`
## 
##   Rule 64/5: [192 cases, mean 5.6, range 3 to 7, est err 0.6]
## 
##     if
##  `fixed acidity` > -1.104703
##  `total sulfur dioxide` <= 0.05019546
##  pH > 0.005698082
##  alcohol <= 0.5413485
##     then
##  outcome = 6.5 - 0.959 pH + 0.61 sulphates - 0.547 `fixed acidity`
##            + 0.504 alcohol - 0.153 `citric acid`
##            - 0.139 `volatile acidity` + 0.086 `residual sugar`
## 
##   Rule 64/6: [409 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` <= -0.3264634
##     then
##  outcome = 4.8 - 0.926 `volatile acidity` + 0.288 alcohol - 0.244 pH
##            - 0.157 `total sulfur dioxide` - 0.015 `citric acid`
##            + 0.01 `fixed acidity` - 0.008 density
## 
##   Rule 64/7: [121 cases, mean 6.5, range 4 to 8, est err 0.7]
## 
##     if
##  alcohol > 1.218881
##     then
##  outcome = 7.2 - 0.857 `fixed acidity` - 0.631 `total sulfur dioxide`
##            - 0.546 pH - 0.53 chlorides - 0.427 alcohol
##            + 0.269 `residual sugar`
## 
## Model 65:
## 
##   Rule 65/1: [478 cases, mean 5.3, range 3 to 8, est err 0.5]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.9 + 0.312 pH - 0.31 alcohol + 0.218 `fixed acidity`
##            + 0.079 sulphates - 0.057 `total sulfur dioxide`
##            - 0.05 chlorides - 0.045 `volatile acidity`
##            + 0.03 `free sulfur dioxide`
## 
##   Rule 65/2: [534 cases, mean 5.3, range 3 to 7, est err 0.5]
## 
##     if
##  sulphates <= -0.2102509
##     then
##  outcome = 5.2 + 0.301 alcohol + 0.155 sulphates
##            - 0.112 `total sulfur dioxide` + 0.099 `free sulfur dioxide`
##            + 0.072 `citric acid`
## 
##   Rule 65/3: [466 cases, mean 5.9, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > -0.2102509
##     then
##  outcome = 6 + 0.347 alcohol - 0.236 `total sulfur dioxide`
##            + 0.033 sulphates + 0.018 `free sulfur dioxide`
##            + 0.01 `citric acid` + 0.009 pH
## 
## Model 66:
## 
##   Rule 66/1: [20 cases, mean 5.1, range 4 to 6, est err 0.9]
## 
##     if
##  `fixed acidity` <= -1.104703
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  alcohol <= 0.5413485
##     then
##  outcome = 4.5 - 1.804 density - 1.324 `volatile acidity`
## 
##   Rule 66/2: [230 cases, mean 5.3, range 4 to 8, est err 0.4]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` > 0.05019546
##     then
##  outcome = 5.5 + 0.349 alcohol - 0.28 `volatile acidity` - 0.13 pH
##            - 0.084 `citric acid`
## 
##   Rule 66/3: [121 cases, mean 5.6, range 3 to 7, est err 0.6]
## 
##     if
##  `fixed acidity` > -1.104703
##  `volatile acidity` > -0.0464296
##  `total sulfur dioxide` <= 0.05019546
##  pH > 0.005698082
##  alcohol <= 0.5413485
##     then
##  outcome = 6.9 - 0.927 pH + 0.597 sulphates - 0.496 `volatile acidity`
##            + 0.44 alcohol - 0.44 `citric acid` - 0.289 density
##            + 0.233 chlorides + 0.062 `total sulfur dioxide`
##            + 0.038 `residual sugar` - 0.036 `fixed acidity`
## 
##   Rule 66/4: [28 cases, mean 5.7, range 4 to 7, est err 0.6]
## 
##     if
##  `fixed acidity` > -1.104703
##  `volatile acidity` > -0.3264634
##  `volatile acidity` <= -0.0464296
##  `total sulfur dioxide` <= 0.05019546
##  pH > 0.005698082
##  alcohol <= 0.5413485
##     then
##  outcome = 7.7 + 9.671 `volatile acidity` + 0.973 `residual sugar`
##            - 0.182 pH - 0.167 `fixed acidity` + 0.107 sulphates
##            + 0.085 alcohol
## 
##   Rule 66/5: [650 cases, mean 5.7, range 3 to 8, est err 0.6]
## 
##     if
##  `total sulfur dioxide` <= 0.05019546
##     then
##  outcome = 5.6 + 0.452 alcohol - 0.334 `volatile acidity`
##            - 0.053 `citric acid` - 0.035 pH
## 
##   Rule 66/6: [32 cases, mean 5.8, range 5 to 7, est err 0.9]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `volatile acidity` <= 0.0935873
##  `total sulfur dioxide` <= 0.05019546
##  pH <= 0.005698082
##  alcohol <= 0.5413485
##     then
##  outcome = 8.6 + 3.06 `volatile acidity` + 1.998 `total sulfur dioxide`
##            + 0.908 alcohol
## 
##   Rule 66/7: [99 cases, mean 5.8, range 3 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol > 0.5413485
##  alcohol <= 2.477156
##     then
##  outcome = 4.3 + 1.466 alcohol - 0.501 `volatile acidity`
##            - 0.303 sulphates + 0.3 `free sulfur dioxide` - 0.187 density
##            + 0.02 `fixed acidity`
## 
##   Rule 66/8: [409 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` <= -0.3264634
##     then
##  outcome = 4.9 - 0.869 `volatile acidity` + 0.231 alcohol - 0.184 pH
##            - 0.173 `total sulfur dioxide`
## 
##   Rule 66/9: [12 cases, mean 6.1, range 4 to 8, est err 1.3]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol > 2.477156
##     then
##  outcome = 4.5 + 2.265 `volatile acidity` + 0.025 alcohol - 0.02 density
##            + 0.015 `fixed acidity`
## 
## Model 67:
## 
##   Rule 67/1: [31 cases, mean 5.1, range 3 to 6, est err 0.9]
## 
##     if
##  `fixed acidity` > 0.6920933
##  sulphates <= -0.1556687
##  alcohol <= -0.4265552
##     then
##  outcome = 4.8 + 0.291 alcohol + 0.233 sulphates
##            - 0.206 `total sulfur dioxide` - 0.167 chlorides
##            + 0.104 `free sulfur dioxide` + 0.102 `citric acid`
## 
##   Rule 67/2: [478 cases, mean 5.3, range 3 to 8, est err 0.5]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 4.6 - 0.443 alcohol + 0.212 pH - 0.062 `total sulfur dioxide`
##            + 0.021 `fixed acidity` + 0.008 sulphates
## 
##   Rule 67/3: [15 cases, mean 5.5, range 5 to 7, est err 0.7]
## 
##     if
##  `fixed acidity` <= -0.7780128
##  chlorides > -0.3681144
##  `total sulfur dioxide` > -0.5202075
##  sulphates > -0.2102509
##  alcohol > -0.4265552
##     then
##  outcome = 2.1 - 4.019 `fixed acidity` - 1.72 chlorides + 1.413 alcohol
##            - 1.033 `total sulfur dioxide`
## 
##   Rule 67/4: [63 cases, mean 5.5, range 3 to 8, est err 1.0]
## 
##     if
##  `fixed acidity` > 0.6920933
##  alcohol <= -0.4265552
##     then
##  outcome = 5.7 + 1.221 `fixed acidity` - 0.862 density
##            + 0.491 `volatile acidity` + 0.02 alcohol + 0.015 sulphates
##            - 0.014 `total sulfur dioxide` - 0.011 chlorides
## 
##   Rule 67/5: [122 cases, mean 5.7, range 4 to 8, est err 0.6]
## 
##     if
##  chlorides <= -0.3681144
##  `total sulfur dioxide` > -0.5202075
##     then
##  outcome = 4.7 - 1.717 chlorides + 0.383 alcohol
##            - 0.291 `total sulfur dioxide` + 0.051 sulphates
##            + 0.027 `free sulfur dioxide` + 0.023 `citric acid`
## 
##   Rule 67/6: [522 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.3 + 0.274 alcohol + 0.178 sulphates
##            - 0.132 `total sulfur dioxide` + 0.094 `free sulfur dioxide`
##            + 0.08 `citric acid`
## 
##   Rule 67/7: [154 cases, mean 5.9, range 3 to 8, est err 0.8]
## 
##     if
##  `fixed acidity` > -0.7780128
##  chlorides > -0.3681144
##  `total sulfur dioxide` > -0.5202075
##  alcohol > -0.4265552
##     then
##  outcome = 6.4 - 2.101 chlorides - 0.364 pH - 0.345 `fixed acidity`
##            - 0.018 `total sulfur dioxide` + 0.012 alcohol
## 
##   Rule 67/8: [150 cases, mean 6.1, range 4 to 8, est err 0.5]
## 
##     if
##  `total sulfur dioxide` <= -0.5202075
##  pH > -0.9439822
##  sulphates > -0.2102509
##     then
##  outcome = 5.9 - 0.315 `free sulfur dioxide` - 0.208 density
##            + 0.178 alcohol + 0.167 `residual sugar` + 0.157 `citric acid`
##            + 0.053 sulphates - 0.045 `total sulfur dioxide`
##            - 0.026 chlorides
## 
##   Rule 67/9: [30 cases, mean 6.4, range 5 to 8, est err 0.7]
## 
##     if
##  `total sulfur dioxide` <= -0.5202075
##  pH <= -0.9439822
##  sulphates > -0.2102509
##  alcohol > -0.4265552
##     then
##  outcome = 5.6 - 3.906 `total sulfur dioxide` + 1.51 pH
##            - 0.077 `free sulfur dioxide` - 0.047 density
##            + 0.038 `residual sugar` + 0.03 `citric acid`
## 
## Model 68:
## 
##   Rule 68/1: [20 cases, mean 5.1, range 4 to 6, est err 0.8]
## 
##     if
##  `fixed acidity` <= -1.104703
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  alcohol <= 0.5413485
##     then
##  outcome = 7.1 + 2.05 `fixed acidity` - 1.51 density
##            - 1.126 `volatile acidity` - 0.523 `residual sugar`
##            + 0.232 `free sulfur dioxide`
## 
##   Rule 68/2: [18 cases, mean 5.3, range 3 to 6, est err 1.7]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  alcohol <= -1.200878
##     then
##  outcome = 16.5 + 8.069 alcohol
## 
##   Rule 68/3: [591 cases, mean 5.4, range 3 to 8, est err 0.5]
## 
##     if
##  `volatile acidity` > -0.3264634
##     then
##  outcome = 5.6 + 0.31 alcohol - 0.261 `volatile acidity` - 0.072 pH
##            - 0.01 `citric acid`
## 
##   Rule 68/4: [283 cases, mean 5.4, range 3 to 7, est err 0.6]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  alcohol <= 0.5413485
##     then
##  outcome = 5.9 - 0.601 `volatile acidity` + 0.574 alcohol
##            - 0.368 `citric acid` - 0.303 pH + 0.271 chlorides
##            - 0.068 `fixed acidity` + 0.052 `residual sugar`
##            + 0.048 density + 0.037 sulphates
## 
##   Rule 68/5: [99 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol > 0.5413485
##  alcohol <= 2.477156
##     then
##  outcome = 4.5 + 1.433 alcohol - 0.502 `volatile acidity`
##            + 0.296 `free sulfur dioxide` - 0.083 density
##            + 0.026 sulphates - 0.017 pH
## 
##   Rule 68/6: [409 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` <= -0.3264634
##     then
##  outcome = 5 - 0.921 `volatile acidity` + 0.318 alcohol - 0.175 pH
##            - 0.12 `total sulfur dioxide`
## 
##   Rule 68/7: [72 cases, mean 5.9, range 4 to 7, est err 0.7]
## 
##     if
##  `fixed acidity` > -1.104703
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  sulphates > -0.1556687
##  alcohol <= 0.5413485
##     then
##  outcome = 6.8 + 0.733 alcohol - 0.474 `fixed acidity`
##            - 0.429 `volatile acidity` + 0.333 density - 0.281 pH
##            + 0.037 `residual sugar` - 0.035 `citric acid`
##            + 0.025 sulphates
## 
##   Rule 68/8: [12 cases, mean 6.1, range 4 to 8, est err 1.2]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol > 2.477156
##     then
##  outcome = 4.3 + 2.058 `volatile acidity` + 0.118 alcohol
##            + 0.09 sulphates - 0.059 pH - 0.056 density
## 
## Model 69:
## 
##   Rule 69/1: [478 cases, mean 5.3, range 3 to 8, est err 0.5]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 5.1 + 0.168 pH + 0.151 `fixed acidity`
##            - 0.134 `total sulfur dioxide` + 0.088 alcohol
##            + 0.049 sulphates - 0.037 chlorides
##            + 0.024 `free sulfur dioxide`
## 
##   Rule 69/2: [534 cases, mean 5.3, range 3 to 7, est err 0.4]
## 
##     if
##  sulphates <= -0.2102509
##     then
##  outcome = 5.3 + 0.284 alcohol + 0.09 sulphates
##            - 0.073 `total sulfur dioxide` + 0.036 `free sulfur dioxide`
## 
##   Rule 69/3: [466 cases, mean 5.9, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > -0.2102509
##     then
##  outcome = 5.9 - 0.307 `total sulfur dioxide` + 0.295 alcohol
##            + 0.069 sulphates + 0.03 `free sulfur dioxide`
##            - 0.024 chlorides + 0.009 `fixed acidity`
## 
## Model 70:
## 
##   Rule 70/1: [21 cases, mean 5.2, range 3 to 6, est err 1.4]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol <= -1.200878
##     then
##  outcome = 12.5 + 5.401 alcohol - 1.231 `fixed acidity`
## 
##   Rule 70/2: [126 cases, mean 5.3, range 4 to 7, est err 0.4]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  alcohol <= -0.6201359
##     then
##  outcome = 3.6 - 1.477 alcohol - 0.707 `volatile acidity`
##            - 0.35 `citric acid` + 0.256 `fixed acidity`
## 
##   Rule 70/3: [591 cases, mean 5.4, range 3 to 8, est err 0.5]
## 
##     if
##  `volatile acidity` > -0.3264634
##     then
##  outcome = 5.6 - 0.384 `volatile acidity` + 0.381 alcohol - 0.089 pH
##            - 0.065 `citric acid` + 0.043 `fixed acidity`
##            - 0.03 `total sulfur dioxide`
## 
##   Rule 70/4: [55 cases, mean 5.5, range 4 to 8, est err 0.5]
## 
##     if
##  `volatile acidity` > -1.446599
##  `volatile acidity` <= -0.3264634
##  pH > 0.5121942
##     then
##  outcome = 5.1 + 0.37 alcohol - 0.079 `volatile acidity` - 0.009 pH
## 
##   Rule 70/5: [99 cases, mean 5.8, range 3 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol > 0.5413485
##  alcohol <= 2.477156
##     then
##  outcome = 4.3 + 1.431 alcohol - 0.473 `volatile acidity`
##            + 0.338 `free sulfur dioxide` - 0.147 density - 0.021 pH
##            - 0.017 `fixed acidity`
## 
##   Rule 70/6: [148 cases, mean 5.9, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` > -1.446599
##  `volatile acidity` <= -0.3264634
##  pH <= 0.5121942
##  alcohol > -0.6201359
##  alcohol <= 1.218881
##     then
##  outcome = 4.2 - 2.088 `volatile acidity` - 0.532 chlorides
##            - 0.2 `free sulfur dioxide` + 0.177 `residual sugar`
##            - 0.021 pH
## 
##   Rule 70/7: [283 cases, mean 6.1, range 3 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  alcohol > -0.6201359
##     then
##  outcome = 5.6 - 0.498 density + 0.493 sulphates
##            - 0.128 `volatile acidity` + 0.038 alcohol - 0.034 pH
## 
##   Rule 70/8: [12 cases, mean 6.1, range 4 to 8, est err 1.4]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol > 2.477156
##     then
##  outcome = 4.1 + 2.201 `volatile acidity` + 0.124 alcohol - 0.085 pH
##            - 0.069 `fixed acidity` + 0.039 `free sulfur dioxide`
## 
##   Rule 70/9: [109 cases, mean 6.5, range 4 to 8, est err 0.8]
## 
##     if
##  `volatile acidity` > -1.446599
##  alcohol > 1.218881
##     then
##  outcome = 8 - 0.81 alcohol - 0.736 chlorides - 0.547 `volatile acidity`
##            - 0.066 `free sulfur dioxide` + 0.058 `residual sugar`
## 
## Model 71:
## 
##   Rule 71/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 5.2 + 0.158 pH - 0.151 `total sulfur dioxide`
##            + 0.138 `fixed acidity` + 0.096 sulphates + 0.064 alcohol
## 
##   Rule 71/2: [31 cases, mean 5.3, range 3 to 7, est err 0.8]
## 
##     if
##  `free sulfur dioxide` <= -1.019859
##  pH > -0.8173581
##  sulphates <= -0.2102509
##  alcohol > -0.4265552
##     then
##  outcome = -7.8 - 11.952 `free sulfur dioxide` - 1.003 chlorides
##            + 0.526 `citric acid`
## 
##   Rule 71/3: [43 cases, mean 5.4, range 4 to 7, est err 0.6]
## 
##     if
##  pH <= -0.8173581
##  sulphates <= -0.2102509
##  alcohol > -0.4265552
##     then
##  outcome = 5.1 + 0.438 `free sulfur dioxide` + 0.364 alcohol
##            - 0.035 `total sulfur dioxide` + 0.031 sulphates - 0.014 pH
## 
##   Rule 71/4: [153 cases, mean 5.6, range 3 to 7, est err 0.5]
## 
##     if
##  `free sulfur dioxide` > -1.019859
##  pH > -0.8173581
##  sulphates <= -0.2102509
##  alcohol > -0.4265552
##     then
##  outcome = 6.2 + 0.539 `fixed acidity` + 0.531 sulphates - 0.267 density
##            + 0.193 `residual sugar` + 0.08 alcohol
##            - 0.077 `total sulfur dioxide` + 0.03 `free sulfur dioxide`
##            - 0.03 pH
## 
##   Rule 71/5: [17 cases, mean 5.7, range 3 to 7, est err 1.2]
## 
##     if
##  `free sulfur dioxide` > -1.019859
##  `total sulfur dioxide` <= -1.030568
##  sulphates <= -0.2102509
##  alcohol > -0.4265552
##     then
##  outcome = -22.7 - 28.18 `total sulfur dioxide` + 4.202 sulphates
##            - 0.927 pH + 0.051 `fixed acidity` - 0.029 density
##            + 0.021 `residual sugar`
## 
##   Rule 71/6: [295 cases, mean 6.2, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > -0.2102509
##  alcohol > -0.4265552
##     then
##  outcome = 6.1 - 0.411 `total sulfur dioxide` + 0.253 alcohol
##            + 0.013 sulphates
## 
## Model 72:
## 
##   Rule 72/1: [21 cases, mean 5.2, range 3 to 6, est err 1.2]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol <= -1.200878
##     then
##  outcome = 12.8 + 5.787 alcohol - 1.231 `fixed acidity`
## 
##   Rule 72/2: [126 cases, mean 5.3, range 4 to 7, est err 0.4]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  alcohol <= -0.6201359
##     then
##  outcome = 3.6 - 1.176 alcohol - 0.982 `volatile acidity` + 0.545 density
##            - 0.471 `citric acid` - 0.284 `residual sugar`
## 
##   Rule 72/3: [591 cases, mean 5.4, range 3 to 8, est err 0.5]
## 
##     if
##  `volatile acidity` > -0.3264634
##     then
##  outcome = 5.5 - 0.363 `volatile acidity` + 0.28 alcohol
##            - 0.076 `citric acid` - 0.068 pH
## 
##   Rule 72/4: [176 cases, mean 6.0, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` > -1.446599
##  `volatile acidity` <= -0.3264634
##  chlorides > -0.4282147
##  alcohol > -0.6201359
##     then
##  outcome = 4.6 - 1.641 `volatile acidity` - 0.831 chlorides
##            - 0.289 `total sulfur dioxide` + 0.119 `citric acid`
##            - 0.111 pH - 0.104 `fixed acidity` + 0.03 alcohol
## 
##   Rule 72/5: [89 cases, mean 6.1, range 4 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  chlorides <= -0.4282147
##     then
##  outcome = 3.3 - 1.648 chlorides - 1.146 `volatile acidity`
##            + 0.381 `citric acid` + 0.273 alcohol - 0.023 pH
##            - 0.02 `fixed acidity` - 0.011 `total sulfur dioxide`
## 
##   Rule 72/6: [44 cases, mean 6.3, range 5 to 7, est err 0.6]
## 
##     if
##  `volatile acidity` <= -1.446599
##  alcohol > -0.6201359
##     then
##  outcome = 5.2 + 0.515 sulphates - 0.422 density
##            - 0.157 `volatile acidity` - 0.085 chlorides
##            + 0.083 `citric acid` - 0.072 `fixed acidity` - 0.056 pH
##            - 0.042 `total sulfur dioxide`
## 
## Model 73:
## 
##   Rule 73/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 5.2 - 0.181 `total sulfur dioxide` + 0.104 `fixed acidity`
##            + 0.103 sulphates + 0.098 pH + 0.096 alcohol
##            + 0.018 `residual sugar`
## 
##   Rule 73/2: [30 cases, mean 5.5, range 5 to 8, est err 0.8]
## 
##     if
##  `fixed acidity` <= -0.5057709
##  `total sulfur dioxide` > 0.05019546
##  sulphates > -0.2102509
##  alcohol > -0.4265552
##     then
##  outcome = 4.9 - 0.806 density + 0.739 `volatile acidity`
## 
##   Rule 73/3: [522 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.7 + 0.59 sulphates - 0.427 pH + 0.409 alcohol
##            - 0.332 `fixed acidity` + 0.311 `free sulfur dioxide`
##            - 0.247 `total sulfur dioxide`
## 
##   Rule 73/4: [233 cases, mean 6.2, range 3 to 8, est err 0.6]
## 
##     if
##  `fixed acidity` > -0.5057709
##  sulphates > -0.2102509
##  alcohol > -0.4265552
##     then
##  outcome = 6.4 - 0.419 `fixed acidity` + 0.091 alcohol
##            - 0.085 `total sulfur dioxide` + 0.028 sulphates
## 
##   Rule 73/5: [197 cases, mean 6.3, range 3 to 8, est err 0.7]
## 
##     if
##  `residual sugar` <= 1.79231
##  `total sulfur dioxide` <= 0.05019546
##  sulphates > -0.2102509
##  alcohol > -0.4265552
##     then
##  outcome = 6.9 + 0.678 `total sulfur dioxide`
##            - 0.408 `free sulfur dioxide` - 0.365 density
##            + 0.313 `residual sugar` + 0.06 alcohol + 0.027 sulphates
## 
##   Rule 73/6: [13 cases, mean 6.8, range 6 to 8, est err 1.6]
## 
##     if
##  `residual sugar` > 1.79231
##  `total sulfur dioxide` <= 0.05019546
##  sulphates > -0.2102509
##  alcohol > -0.4265552
##     then
##  outcome = 11.5 - 1.098 `residual sugar` - 0.934 sulphates
##            - 0.022 `total sulfur dioxide` + 0.018 alcohol
## 
## Model 74:
## 
##   Rule 74/1: [1000 cases, mean 5.6, range 3 to 8, est err 0.5]
## 
##  outcome = 5.5 - 0.298 `volatile acidity` + 0.199 alcohol
##            + 0.066 `fixed acidity`
## 
## Model 75:
## 
##   Rule 75/1: [38 cases, mean 5.0, range 5 to 5, est err 0.4]
## 
##     if
##  `total sulfur dioxide` > 2.121659
##  alcohol <= -0.4265552
##     then
##  outcome = 4.5 + 0.298 `volatile acidity` - 0.199 alcohol
##            - 0.066 `fixed acidity`
## 
##   Rule 75/2: [390 cases, mean 5.3, range 3 to 7, est err 0.5]
## 
##     if
##  `citric acid` <= 0.9763548
##  `total sulfur dioxide` <= 2.121659
##  alcohol <= -0.4265552
##     then
##  outcome = 4.5 - 0.442 alcohol - 0.177 `citric acid`
##            - 0.118 `total sulfur dioxide` + 0.045 sulphates
##            + 0.041 `fixed acidity` + 0.023 pH - 0.015 chlorides
##            + 0.01 `free sulfur dioxide`
## 
##   Rule 75/3: [78 cases, mean 5.3, range 3 to 7, est err 0.8]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= -0.6102711
##  sulphates <= 1.154306
##  alcohol > -0.4265552
##  alcohol <= 1.122091
##     then
##  outcome = 5.3 + 0.669 sulphates - 0.436 density
## 
##   Rule 75/4: [578 cases, mean 5.5, range 3 to 8, est err 0.7]
## 
##     if
##  `total sulfur dioxide` > -0.6102711
##  sulphates <= 1.154306
##  alcohol <= 2.573946
##     then
##  outcome = 6.4 + 0.797 sulphates + 0.589 alcohol
##            - 0.502 `total sulfur dioxide` - 0.039 pH
##            + 0.035 `free sulfur dioxide` - 0.035 density
## 
##   Rule 75/5: [570 cases, mean 5.5, range 3 to 8, est err 0.8]
## 
##     if
##  `total sulfur dioxide` > -0.5502287
##  `total sulfur dioxide` <= 2.121659
##     then
##  outcome = 4.9 - 0.236 `total sulfur dioxide` + 0.147 sulphates
##            - 0.104 `citric acid` - 0.1 alcohol - 0.074 chlorides
##            + 0.046 `free sulfur dioxide` + 0.033 `fixed acidity`
##            + 0.018 pH
## 
##   Rule 75/6: [14 cases, mean 5.7, range 4 to 6, est err 1.2]
## 
##     if
##  `citric acid` <= 0.9763548
##  `total sulfur dioxide` > -0.5502287
##  alcohol <= -1.200878
##     then
##  outcome = 6.6 - 0.116 alcohol - 0.047 `citric acid`
## 
##   Rule 75/7: [327 cases, mean 5.7, range 3 to 8, est err 0.7]
## 
##     if
##  `total sulfur dioxide` <= -0.5502287
##  sulphates <= 0.9905592
##     then
##  outcome = 6.8 + 1.2 `total sulfur dioxide` + 0.785 sulphates
##            + 0.337 `fixed acidity` - 0.334 `citric acid`
##            + 0.181 chlorides + 0.029 alcohol
## 
##   Rule 75/8: [51 cases, mean 6.1, range 4 to 8, est err 1.0]
## 
##     if
##  `total sulfur dioxide` <= -0.5502287
##  sulphates > 0.9905592
##     then
##  outcome = 10.1 + 5.327 `total sulfur dioxide` - 0.016 alcohol
##            + 0.015 `fixed acidity` - 0.013 `citric acid`
## 
##   Rule 75/9: [255 cases, mean 6.1, range 3 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  alcohol > -0.4265552
##     then
##  outcome = 4.5 - 0.929 `volatile acidity` - 0.6 chlorides + 0.534 alcohol
##            - 0.417 `total sulfur dioxide` + 0.346 sulphates - 0.343 pH
##            + 0.276 `residual sugar` + 0.112 `free sulfur dioxide`
## 
##   Rule 75/10: [18 cases, mean 6.2, range 4 to 8, est err 1.1]
## 
##     if
##  alcohol > 2.573946
##     then
##  outcome = 5.3 - 1.497 chlorides - 1.393 `total sulfur dioxide`
##            + 0.04 alcohol + 0.035 sulphates - 0.027 pH
##            - 0.023 `fixed acidity` + 0.017 `free sulfur dioxide`
## 
##   Rule 75/11: [46 cases, mean 6.3, range 5 to 8, est err 0.6]
## 
##     if
##  sulphates > 1.154306
##  alcohol > -0.4265552
##  alcohol <= 2.573946
##     then
##  outcome = 6.4 + 0.469 alcohol - 0.042 `total sulfur dioxide`
##            + 0.037 sulphates - 0.028 pH - 0.025 `fixed acidity`
##            + 0.018 `free sulfur dioxide`
## 
##   Rule 75/12: [122 cases, mean 6.5, range 4 to 8, est err 0.9]
## 
##     if
##  sulphates <= 1.154306
##  alcohol > 1.122091
##     then
##  outcome = 6.7 + 0.802 sulphates - 0.221 density + 0.187 alcohol
##            - 0.119 `total sulfur dioxide` - 0.077 pH
##            + 0.064 `free sulfur dioxide` - 0.016 `fixed acidity`
## 
## Model 76:
## 
##   Rule 76/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 5.3 - 0.274 `volatile acidity` + 0.11 alcohol
##            + 0.046 `fixed acidity` - 0.024 pH
## 
##   Rule 76/2: [68 cases, mean 5.6, range 4 to 8, est err 0.7]
## 
##     if
##  `fixed acidity` <= -0.7235644
##  `volatile acidity` <= 0.2056008
##  alcohol > -0.4265552
##     then
##  outcome = 3.4 - 1.704 `fixed acidity` - 0.651 pH - 0.637 density
##            + 0.489 `citric acid` - 0.393 `total sulfur dioxide`
##            + 0.238 `residual sugar`
## 
##   Rule 76/3: [179 cases, mean 5.6, range 3 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` > 0.2056008
##  alcohol > -0.4265552
##     then
##  outcome = 6 - 0.61 `volatile acidity` + 0.481 alcohol
## 
##   Rule 76/4: [522 cases, mean 5.9, range 3 to 8, est err 0.6]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 6 - 0.332 `volatile acidity` - 0.256 pH
##            - 0.15 `total sulfur dioxide` + 0.147 alcohol
##            - 0.133 `fixed acidity`
## 
## Model 77:
## 
##   Rule 77/1: [730 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.2809896
##     then
##  outcome = 5.6 + 0.741 sulphates - 0.24 density + 0.193 `fixed acidity`
##            - 0.16 `total sulfur dioxide` - 0.152 `citric acid`
##            + 0.107 `free sulfur dioxide` + 0.088 `residual sugar`
##            + 0.066 alcohol
## 
##   Rule 77/2: [270 cases, mean 6.0, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > 0.2809896
##     then
##  outcome = 5.8 + 0.333 alcohol - 0.304 `total sulfur dioxide`
##            + 0.014 sulphates - 0.008 chlorides
## 
## Model 78:
## 
##   Rule 78/1: [428 cases, mean 5.3, range 3 to 7, est err 0.4]
## 
##     if
##  alcohol <= -0.5233455
##     then
##  outcome = 4.8 - 0.498 alcohol - 0.235 `volatile acidity`
##            + 0.219 `fixed acidity` + 0.189 pH - 0.021 chlorides
##            - 0.017 `total sulfur dioxide`
## 
##   Rule 78/2: [572 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  alcohol > -0.5233455
##     then
##  outcome = 5.7 + 0.398 alcohol - 0.325 `volatile acidity` - 0.151 pH
##            - 0.06 chlorides - 0.047 `total sulfur dioxide`
## 
## Model 79:
## 
##   Rule 79/1: [730 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.2809896
##     then
##  outcome = 5.7 + 0.789 sulphates - 0.245 density
##            - 0.202 `total sulfur dioxide` - 0.161 `citric acid`
##            - 0.149 pH + 0.125 `free sulfur dioxide`
##            + 0.101 `fixed acidity` + 0.088 `residual sugar`
## 
##   Rule 79/2: [961 cases, mean 5.6, range 3 to 8, est err 0.6]
## 
##     if
##  alcohol <= 2.186785
##     then
##  outcome = 5.8 - 0.316 `total sulfur dioxide` + 0.254 alcohol
##            - 0.178 `volatile acidity`
## 
##   Rule 79/3: [17 cases, mean 6.8, range 5 to 8, est err 1.4]
## 
##     if
##  sulphates > 0.2809896
##  alcohol > 2.186785
##     then
##  outcome = 13.8 - 2.248 alcohol - 0.999 `citric acid`
##            - 0.95 `total sulfur dioxide`
## 
## Model 80:
## 
##   Rule 80/1: [391 cases, mean 5.2, range 3 to 7, est err 0.5]
## 
##     if
##  alcohol <= -0.6201359
##     then
##  outcome = 4.6 - 0.471 alcohol + 0.231 `fixed acidity` + 0.194 pH
##            - 0.071 `volatile acidity` + 0.039 sulphates - 0.03 chlorides
## 
##   Rule 80/2: [609 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  alcohol > -0.6201359
##     then
##  outcome = 5.5 + 0.467 alcohol - 0.26 `volatile acidity` - 0.115 pH
##            + 0.05 sulphates - 0.039 chlorides + 0.038 `fixed acidity`
## 
## Model 81:
## 
##   Rule 81/1: [250 cases, mean 5.3, range 4 to 8, est err 0.4]
## 
##     if
##  `total sulfur dioxide` > 0.4704923
##     then
##  outcome = 5.3 + 0.19 sulphates - 0.145 density
##            - 0.066 `total sulfur dioxide` - 0.053 pH
##            + 0.039 `free sulfur dioxide` - 0.025 `citric acid`
##            + 0.02 `residual sugar`
## 
##   Rule 81/2: [537 cases, mean 5.6, range 3 to 8, est err 0.6]
## 
##     if
##  `total sulfur dioxide` <= 0.4704923
##  sulphates <= 0.2809896
##     then
##  outcome = 6 + 0.898 sulphates - 0.24 density - 0.178 pH
##            - 0.132 `total sulfur dioxide` + 0.078 `free sulfur dioxide`
##            - 0.051 `citric acid` + 0.04 `residual sugar`
## 
##   Rule 81/3: [270 cases, mean 6.0, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > 0.2809896
##     then
##  outcome = 5.9 - 0.343 `total sulfur dioxide` + 0.099 pH
## 
##   Rule 81/4: [73 cases, mean 6.5, range 5 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` <= -1.110558
##  sulphates > 0.2809896
##     then
##  outcome = 6.3 + 0.588 `citric acid` + 0.232 alcohol
##            - 0.051 `total sulfur dioxide` - 0.024 `volatile acidity`
## 
##   Rule 81/5: [116 cases, mean 6.5, range 4 to 8, est err 1.2]
## 
##     if
##  alcohol > 1.315671
##     then
##  outcome = 9.4 - 1.058 alcohol - 0.942 `fixed acidity`
##            + 0.378 `citric acid`
## 
## Model 82:
## 
##   Rule 82/1: [478 cases, mean 5.3, range 3 to 8, est err 0.5]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 5 + 0.286 `fixed acidity` + 0.213 pH
##            - 0.201 `volatile acidity` + 0.054 alcohol
## 
##   Rule 82/2: [390 cases, mean 5.4, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` > 0.1215907
##  pH > -1.007294
##     then
##  outcome = 6.1 + 0.737 alcohol - 0.504 `volatile acidity` - 0.334 pH
##            + 0.192 sulphates
## 
##   Rule 82/3: [149 cases, mean 5.6, range 4 to 8, est err 0.7]
## 
##     if
##  pH <= -1.007294
##     then
##  outcome = 5.6 + 0.825 `citric acid` - 0.452 `fixed acidity`
##            + 0.049 alcohol - 0.028 pH - 0.027 `volatile acidity`
## 
##   Rule 82/4: [43 cases, mean 5.7, range 3 to 7, est err 0.7]
## 
##     if
##  `volatile acidity` <= 0.1215907
##  chlorides > 0.1327215
##  pH > -1.007294
##  alcohol > -0.4265552
##     then
##  outcome = 4.9 - 1.569 pH - 0.079 `volatile acidity` + 0.073 alcohol
## 
##   Rule 82/5: [238 cases, mean 6.1, range 4 to 8, est err 0.5]
## 
##     if
##  `volatile acidity` <= 0.1215907
##  chlorides <= 0.1327215
##  pH > -1.007294
##  alcohol > -0.4265552
##     then
##  outcome = 5.5 - 0.378 `total sulfur dioxide` + 0.372 alcohol - 0.338 pH
##            - 0.303 `volatile acidity` + 0.279 `fixed acidity`
##            + 0.203 `free sulfur dioxide` + 0.174 `residual sugar`
##            + 0.019 sulphates
## 
## Model 83:
## 
##   Rule 83/1: [749 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.3355719
##     then
##  outcome = 5.8 + 0.685 sulphates - 0.256 density
##            - 0.186 `total sulfur dioxide` - 0.097 pH - 0.09 `citric acid`
##            + 0.079 `residual sugar` + 0.067 `free sulfur dioxide`
##            - 0.02 `volatile acidity` + 0.019 alcohol
## 
##   Rule 83/2: [251 cases, mean 6.0, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > 0.3355719
##     then
##  outcome = 5.9 - 0.506 `volatile acidity` - 0.31 `citric acid`
##            - 0.3 `free sulfur dioxide` + 0.271 alcohol + 0.21 pH
##            + 0.15 `fixed acidity`
## 
## Model 84:
## 
##   Rule 84/1: [215 cases, mean 5.2, range 4 to 7, est err 0.3]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` > 0.05019546
##  alcohol <= 1.218881
##     then
##  outcome = 5.4 + 0.379 alcohol + 0.285 `fixed acidity`
##            - 0.192 `volatile acidity`
## 
##   Rule 84/2: [21 cases, mean 5.2, range 3 to 6, est err 1.0]
## 
##     if
##  `volatile acidity` > -0.3264634
##  alcohol <= -1.200878
##     then
##  outcome = 13.3 + 6.335 alcohol - 0.995 `fixed acidity`
## 
##   Rule 84/3: [45 cases, mean 5.3, range 3 to 6, est err 0.8]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  `citric acid` <= 1.326088
##  chlorides > 0.1327215
##  alcohol <= 1.218881
##     then
##  outcome = 4.2 - 0.542 `volatile acidity` + 0.244 alcohol - 0.206 pH
## 
##   Rule 84/4: [40 cases, mean 5.4, range 3 to 7, est err 0.9]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  alcohol > 0.6381389
##  alcohol <= 1.218881
##     then
##  outcome = 2.2 + 5.174 alcohol + 2.282 `total sulfur dioxide`
##            + 0.695 sulphates - 0.577 `volatile acidity`
## 
##   Rule 84/5: [343 cases, mean 5.5, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  alcohol > -1.200878
##     then
##  outcome = 5.9 + 0.686 alcohol - 0.441 `volatile acidity` + 0.232 density
##            + 0.101 `total sulfur dioxide`
## 
##   Rule 84/6: [51 cases, mean 5.7, range 4 to 8, est err 1.3]
## 
##     if
##  `fixed acidity` <= -1.104703
##  `total sulfur dioxide` <= 0.05019546
##     then
##  outcome = 4.5 - 1.314 density - 0.914 chlorides
##            - 0.69 `volatile acidity` + 0.676 `total sulfur dioxide`
## 
##   Rule 84/7: [42 cases, mean 5.8, range 5 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  `citric acid` > 1.326088
##  alcohol <= 1.218881
##     then
##  outcome = -0.3 + 2.43 `citric acid` - 1.737 `volatile acidity`
##            + 0.533 alcohol + 0.438 density
## 
##   Rule 84/8: [409 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` <= -0.3264634
##     then
##  outcome = 4.9 - 0.687 `volatile acidity` + 0.396 alcohol
##            + 0.288 `fixed acidity` - 0.043 pH + 0.022 `citric acid`
## 
##   Rule 84/9: [121 cases, mean 6.5, range 4 to 8, est err 0.8]
## 
##     if
##  alcohol > 1.218881
##     then
##  outcome = 7.7 - 0.702 `fixed acidity` - 0.63 chlorides - 0.55 pH
##            + 0.546 `volatile acidity` + 0.509 `citric acid`
##            - 0.402 alcohol - 0.348 `total sulfur dioxide`
## 
## Model 85:
## 
##   Rule 85/1: [730 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.2809896
##     then
##  outcome = 5.8 + 0.743 sulphates - 0.281 density
##            - 0.216 `total sulfur dioxide` + 0.145 `free sulfur dioxide`
##            + 0.11 `residual sugar` - 0.107 pH
## 
##   Rule 85/2: [270 cases, mean 6.0, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > 0.2809896
##     then
##  outcome = 5.8 - 0.249 `total sulfur dioxide` - 0.237 `volatile acidity`
##            + 0.175 alcohol + 0.051 sulphates - 0.036 density
##            - 0.026 chlorides + 0.023 `residual sugar`
## 
## Model 86:
## 
##   Rule 86/1: [82 cases, mean 5.1, range 4 to 6, est err 0.7]
## 
##     if
##  density <= -0.3709094
##  alcohol <= -0.6201359
##     then
##  outcome = 4.8 - 0.965 alcohol + 0.742 `total sulfur dioxide`
##            + 0.506 `fixed acidity` + 0.391 pH
## 
##   Rule 86/2: [391 cases, mean 5.2, range 3 to 7, est err 0.5]
## 
##     if
##  alcohol <= -0.6201359
##     then
##  outcome = 4.5 - 0.484 alcohol + 0.261 `fixed acidity` + 0.185 pH
##            - 0.11 `citric acid` - 0.096 `volatile acidity`
## 
##   Rule 86/3: [168 cases, mean 5.4, range 3 to 7, est err 0.7]
## 
##     if
##  `total sulfur dioxide` <= -0.310059
##  alcohol <= -0.6201359
##     then
##  outcome = 7.4 + 2.362 `total sulfur dioxide` + 0.029 `fixed acidity`
##            - 0.024 alcohol - 0.017 `volatile acidity` + 0.016 pH
##            - 0.013 `citric acid`
## 
##   Rule 86/4: [61 cases, mean 5.4, range 4 to 6, est err 0.5]
## 
##     if
##  `fixed acidity` <= 0.8554384
##  `total sulfur dioxide` <= -0.310059
##  density > -0.01658035
##  alcohol <= -0.6201359
##     then
##  outcome = 5 + 1.285 density - 0.366 `volatile acidity` - 0.019 alcohol
##            + 0.015 `total sulfur dioxide` + 0.01 `fixed acidity`
## 
##   Rule 86/5: [34 cases, mean 5.5, range 3 to 7, est err 0.7]
## 
##     if
##  `fixed acidity` > 0.8554384
##  `total sulfur dioxide` <= -0.310059
##  alcohol <= -0.6201359
##     then
##  outcome = 4.6 - 1.378 chlorides + 1.116 `fixed acidity` - 0.777 density
## 
##   Rule 86/6: [609 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  alcohol > -0.6201359
##     then
##  outcome = 5.6 + 0.476 alcohol - 0.258 `volatile acidity` - 0.188 pH
##            - 0.082 `total sulfur dioxide`
## 
## Model 87:
## 
##   Rule 87/1: [20 cases, mean 5.3, range 3 to 7, est err 1.0]
## 
##     if
##  `citric acid` <= -1.371853
##  `free sulfur dioxide` <= 0.1833961
##  sulphates <= 0.06266046
##  alcohol > -0.3297648
##     then
##  outcome = 3.4 - 2.254 `residual sugar` - 1.968 `fixed acidity`
## 
##   Rule 87/2: [657 cases, mean 5.4, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.06266046
##     then
##  outcome = 5.5 + 0.366 sulphates - 0.125 `total sulfur dioxide`
##            + 0.097 alcohol + 0.07 `free sulfur dioxide`
##            - 0.069 `volatile acidity` - 0.059 density - 0.038 pH
## 
##   Rule 87/3: [277 cases, mean 5.7, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates <= 0.06266046
##  alcohol > -0.3297648
##     then
##  outcome = 6.2 + 0.388 sulphates - 0.138 `total sulfur dioxide`
##            + 0.11 `free sulfur dioxide` + 0.084 alcohol - 0.077 density
##            - 0.069 pH - 0.06 `volatile acidity`
## 
##   Rule 87/4: [177 cases, mean 5.7, range 4 to 8, est err 0.7]
## 
##     if
##  `citric acid` > -1.371853
##  `free sulfur dioxide` <= 0.1833961
##  sulphates <= 0.06266046
##  alcohol > -0.3297648
##     then
##  outcome = 5.9 + 1.131 sulphates + 0.283 `free sulfur dioxide`
##            - 0.233 density - 0.212 `total sulfur dioxide` - 0.177 pH
## 
##   Rule 87/5: [343 cases, mean 5.9, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > 0.06266046
##     then
##  outcome = 6 - 0.32 `total sulfur dioxide` + 0.176 alcohol
##            + 0.017 sulphates - 0.011 `volatile acidity`
## 
## Model 88:
## 
##   Rule 88/1: [879 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  alcohol <= 1.218881
##     then
##  outcome = 5.4 + 0.351 alcohol - 0.26 `volatile acidity` - 0.07 chlorides
##            - 0.051 pH - 0.047 `total sulfur dioxide`
##            + 0.041 `fixed acidity`
## 
##   Rule 88/2: [121 cases, mean 6.5, range 4 to 8, est err 0.7]
## 
##     if
##  alcohol > 1.218881
##     then
##  outcome = 7.2 - 1.067 `fixed acidity` - 0.765 pH - 0.694 chlorides
##            + 0.406 density - 0.394 `total sulfur dioxide`
## 
## Model 89:
## 
##   Rule 89/1: [250 cases, mean 5.3, range 4 to 8, est err 0.4]
## 
##     if
##  `total sulfur dioxide` > 0.4704923
##     then
##  outcome = 5.2 + 0.256 `fixed acidity` - 0.246 density
##            + 0.116 `volatile acidity` + 0.109 sulphates
##            + 0.108 `residual sugar` - 0.023 `total sulfur dioxide`
##            - 0.022 `citric acid` + 0.018 `free sulfur dioxide`
## 
##   Rule 89/2: [537 cases, mean 5.6, range 3 to 8, est err 0.6]
## 
##     if
##  `total sulfur dioxide` <= 0.4704923
##  sulphates <= 0.2809896
##     then
##  outcome = 5.9 + 0.879 sulphates + 0.137 `fixed acidity` - 0.105 density
##            - 0.099 `total sulfur dioxide` - 0.095 `citric acid`
##            + 0.078 `free sulfur dioxide`
## 
##   Rule 89/3: [197 cases, mean 5.8, range 3 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` > -1.110558
##  sulphates > 0.2809896
##     then
##  outcome = 5.3 + 0.127 pH - 0.121 `free sulfur dioxide`
##            + 0.113 `fixed acidity` + 0.101 alcohol + 0.079 sulphates
##            - 0.071 density - 0.045 `total sulfur dioxide`
##            - 0.041 `citric acid` - 0.037 `volatile acidity`
##            + 0.033 `residual sugar`
## 
##   Rule 89/4: [182 cases, mean 6.2, range 3 to 8, est err 0.7]
## 
##     if
##  `total sulfur dioxide` <= 0.05019546
##  sulphates > 0.2809896
##     then
##  outcome = 7 + 0.813 `total sulfur dioxide` + 0.412 pH
##            + 0.249 `citric acid` - 0.203 sulphates
##            + 0.202 `residual sugar` - 0.046 `free sulfur dioxide`
##            + 0.039 alcohol
## 
##   Rule 89/5: [133 cases, mean 6.3, range 5 to 8, est err 0.8]
## 
##     if
##  `volatile acidity` <= -1.110558
##     then
##  outcome = 6.2 + 0.7 `citric acid` + 0.268 alcohol
##            + 0.031 `fixed acidity` + 0.025 pH - 0.022 density
##            - 0.021 `volatile acidity` - 0.018 `free sulfur dioxide`
## 
## Model 90:
## 
##   Rule 90/1: [1000 cases, mean 5.6, range 3 to 8, est err 0.5]
## 
##  outcome = 5.5 + 0.512 alcohol - 0.255 `volatile acidity`
## 
## Model 91:
## 
##   Rule 91/1: [250 cases, mean 5.3, range 4 to 8, est err 0.4]
## 
##     if
##  `total sulfur dioxide` > 0.4704923
##     then
##  outcome = 5.2 + 0.284 sulphates - 0.093 `total sulfur dioxide`
##            - 0.08 density - 0.074 pH + 0.057 `free sulfur dioxide`
##            - 0.054 `citric acid` + 0.052 `fixed acidity`
##            + 0.029 `residual sugar`
## 
##   Rule 91/2: [159 cases, mean 5.5, range 3 to 7, est err 0.7]
## 
##     if
##  `volatile acidity` > -1.110558
##  sulphates > 0.2809896
##  alcohol <= 1.315671
##     then
##  outcome = 4.9 - 0.022 `total sulfur dioxide` - 0.017 `volatile acidity`
##            + 0.011 alcohol - 0.011 `free sulfur dioxide`
##            - 0.009 chlorides
## 
##   Rule 91/3: [537 cases, mean 5.6, range 3 to 8, est err 0.6]
## 
##     if
##  `total sulfur dioxide` <= 0.4704923
##  sulphates <= 0.2809896
##     then
##  outcome = 6 + 0.938 sulphates - 0.211 density - 0.195 pH
##            - 0.114 `total sulfur dioxide` + 0.069 `free sulfur dioxide`
##            - 0.066 `citric acid` + 0.064 `fixed acidity`
##            + 0.036 `residual sugar`
## 
##   Rule 91/4: [15 cases, mean 5.7, range 5 to 7, est err 2.4]
## 
##     if
##  `volatile acidity` > -1.110558
##  `residual sugar` > 0.9044686
##  `free sulfur dioxide` <= 0.985566
##  sulphates > 0.2809896
##  alcohol <= 1.315671
##     then
##  outcome = -10.8 + 5.198 `residual sugar` + 5.073 `fixed acidity`
##            + 3.682 pH + 3.634 sulphates - 2.975 `volatile acidity`
##            - 1.591 alcohol
## 
##   Rule 91/5: [234 cases, mean 6.0, range 3 to 8, est err 0.7]
## 
##     if
##  `residual sugar` <= 0.9044686
##  sulphates > 0.2809896
##     then
##  outcome = 6.3 + 0.689 `residual sugar` + 0.096 pH - 0.09 `citric acid`
##            + 0.084 `fixed acidity`
## 
##   Rule 91/6: [133 cases, mean 6.3, range 5 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` <= -1.110558
##     then
##  outcome = 6 + 0.554 `citric acid` + 0.324 alcohol
##            + 0.299 `fixed acidity` - 0.023 `total sulfur dioxide`
##            - 0.017 `volatile acidity` - 0.012 `free sulfur dioxide`
##            - 0.009 chlorides
## 
##   Rule 91/7: [116 cases, mean 6.5, range 4 to 8, est err 1.0]
## 
##     if
##  alcohol > 1.315671
##     then
##  outcome = 9.2 - 1.283 chlorides - 1.196 alcohol
## 
## Model 92:
## 
##   Rule 92/1: [391 cases, mean 5.2, range 3 to 7, est err 0.4]
## 
##     if
##  alcohol <= -0.6201359
##     then
##  outcome = 4.8 - 0.354 alcohol + 0.22 pH + 0.168 `fixed acidity`
##            - 0.068 `volatile acidity` + 0.03 sulphates - 0.027 chlorides
## 
##   Rule 92/2: [228 cases, mean 5.5, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` > 0.2056008
##  alcohol > -0.6201359
##     then
##  outcome = 5.9 + 0.658 alcohol - 0.553 `volatile acidity`
## 
##   Rule 92/3: [609 cases, mean 5.8, range 3 to 8, est err 0.6]
## 
##     if
##  alcohol > -0.6201359
##     then
##  outcome = 5.7 - 0.343 pH + 0.336 alcohol - 0.304 `total sulfur dioxide`
##            - 0.258 `fixed acidity` + 0.17 `citric acid` + 0.137 sulphates
##            + 0.134 `free sulfur dioxide` - 0.035 `volatile acidity`
## 
## Model 93:
## 
##   Rule 93/1: [730 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.2809896
##     then
##  outcome = 5.7 + 0.732 sulphates - 0.276 density + 0.212 `fixed acidity`
##            - 0.181 `citric acid` - 0.131 `total sulfur dioxide`
##            - 0.128 `volatile acidity` - 0.104 pH + 0.098 `residual sugar`
##            + 0.076 `free sulfur dioxide`
## 
##   Rule 93/2: [270 cases, mean 6.0, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > 0.2809896
##     then
##  outcome = 5.8 - 0.286 `total sulfur dioxide` + 0.212 pH
##            - 0.106 `volatile acidity` + 0.055 alcohol + 0.01 sulphates
## 
##   Rule 93/3: [73 cases, mean 6.5, range 5 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` <= -1.110558
##  sulphates > 0.2809896
##     then
##  outcome = 7 + 0.479 alcohol - 0.333 pH + 0.296 density - 0.255 sulphates
##            - 0.013 `volatile acidity` - 0.013 `total sulfur dioxide`
## 
## Model 94:
## 
##   Rule 94/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 5 + 0.168 `fixed acidity` - 0.161 alcohol
##            - 0.141 `volatile acidity` + 0.13 pH
##            - 0.023 `total sulfur dioxide`
## 
##   Rule 94/2: [19 cases, mean 5.5, range 3 to 8, est err 1.3]
## 
##     if
##  pH > 1.968371
##  alcohol > -0.4265552
##     then
##  outcome = 4.4 + 0.873 alcohol + 0.739 `citric acid`
##            - 0.013 `volatile acidity` - 0.009 pH
## 
##   Rule 94/3: [110 cases, mean 5.6, range 4 to 8, est err 0.6]
## 
##     if
##  `fixed acidity` <= -0.7780128
##  pH <= 1.968371
##  alcohol > -0.4265552
##     then
##  outcome = 3.8 - 0.977 `fixed acidity` + 0.538 alcohol - 0.302 density
## 
##   Rule 94/4: [393 cases, mean 6.0, range 3 to 8, est err 0.7]
## 
##     if
##  `fixed acidity` > -0.7780128
##  pH <= 1.968371
##  alcohol > -0.4265552
##     then
##  outcome = 6 + 0.46 alcohol - 0.346 `fixed acidity` + 0.296 `citric acid`
##            - 0.208 pH + 0.076 sulphates
## 
## Model 95:
## 
##   Rule 95/1: [788 cases, mean 5.5, range 3 to 8, est err 0.5]
## 
##     if
##  sulphates <= 0.4993187
##     then
##  outcome = 5.5 + 0.425 sulphates - 0.228 density
##            - 0.193 `total sulfur dioxide` + 0.142 `fixed acidity`
##            + 0.125 `free sulfur dioxide` + 0.124 `residual sugar`
##            - 0.082 `volatile acidity` - 0.082 `citric acid` - 0.024 pH
## 
##   Rule 95/2: [519 cases, mean 5.6, range 3 to 8, est err 0.6]
## 
##     if
##  `total sulfur dioxide` <= 0.1102379
##  sulphates <= 0.4993187
##     then
##  outcome = 5.9 + 0.964 sulphates - 0.224 `volatile acidity`
##            - 0.224 `citric acid` - 0.188 density
##            - 0.066 `total sulfur dioxide` + 0.047 `free sulfur dioxide`
##            - 0.047 pH + 0.036 `residual sugar`
## 
##   Rule 95/3: [212 cases, mean 5.9, range 3 to 8, est err 0.6]
## 
##     if
##  sulphates > 0.4993187
##     then
##  outcome = 5.8 - 0.348 `total sulfur dioxide` - 0.291 `volatile acidity`
##            - 0.025 `citric acid` + 0.022 sulphates
##            + 0.019 `fixed acidity` - 0.016 density
##            + 0.012 `residual sugar` + 0.01 pH
##            + 0.009 `free sulfur dioxide`
## 
##   Rule 95/4: [21 cases, mean 6.6, range 5 to 8, est err 1.3]
## 
##     if
##  `residual sugar` > 2.074805
##  `total sulfur dioxide` <= 0.1102379
##     then
##  outcome = 9.5 + 0.915 `total sulfur dioxide` - 0.402 `residual sugar`
##            + 0.022 sulphates
## 
## Model 96:
## 
##   Rule 96/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 5.2 + 0.25 `fixed acidity` + 0.132 alcohol + 0.128 pH
##            - 0.041 `volatile acidity`
## 
##   Rule 96/2: [522 cases, mean 5.9, range 3 to 8, est err 0.7]
## 
##     if
##  alcohol > -0.4265552
##     then
##  outcome = 5.8 + 0.549 alcohol - 0.263 pH - 0.208 `fixed acidity`
##            + 0.155 `citric acid` + 0.15 sulphates
##            - 0.091 `total sulfur dioxide` - 0.034 `volatile acidity`
## 
## Model 97:
## 
##   Rule 97/1: [13 cases, mean 5.0, range 5 to 5, est err 1.2]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  `total sulfur dioxide` > 1.671341
##  sulphates > -0.3194155
##     then
##  outcome = 5 + 1.678 `volatile acidity` + 0.438 sulphates
## 
##   Rule 97/2: [258 cases, mean 5.4, range 3 to 7, est err 0.6]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  sulphates <= -0.0465041
##     then
##  outcome = 5.8 + 0.809 sulphates - 0.4 `volatile acidity`
##            - 0.36 `citric acid` + 0.09 `total sulfur dioxide`
## 
##   Rule 97/3: [591 cases, mean 5.4, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` > -0.3264634
##     then
##  outcome = 5.2 - 0.202 `volatile acidity` - 0.109 `total sulfur dioxide`
##            - 0.094 `citric acid` + 0.081 `free sulfur dioxide`
##            + 0.017 sulphates
## 
##   Rule 97/4: [130 cases, mean 5.4, range 4 to 7, est err 0.5]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  sulphates <= -0.3194155
##     then
##  outcome = 4.5 - 0.877 chlorides - 0.557 `volatile acidity`
##            - 0.01 `total sulfur dioxide` + 0.01 sulphates
## 
##   Rule 97/5: [49 cases, mean 5.5, range 3 to 7, est err 0.8]
## 
##     if
##  `volatile acidity` > -0.9425378
##  `volatile acidity` <= -0.3264634
##  chlorides > 0.09265464
##     then
##  outcome = 2 - 5.421 `volatile acidity` - 0.589 `free sulfur dioxide`
## 
##   Rule 97/6: [71 cases, mean 5.6, range 3 to 7, est err 0.8]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  chlorides > 0.09265464
##  `total sulfur dioxide` <= 1.671341
##     then
##  outcome = 4.3 - 0.594 `volatile acidity` - 0.228 `free sulfur dioxide`
##            - 0.178 `total sulfur dioxide` + 0.054 sulphates - 0.053 pH
##            - 0.024 chlorides
## 
##   Rule 97/7: [220 cases, mean 6.1, range 4 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  chlorides <= 0.09265464
##  sulphates > -0.3194155
##     then
##  outcome = 5.4 - 0.876 `volatile acidity` + 0.476 chlorides
##            - 0.418 `total sulfur dioxide` + 0.13 `free sulfur dioxide`
##            + 0.038 sulphates - 0.023 pH
## 
##   Rule 97/8: [254 cases, mean 6.1, range 3 to 8, est err 0.7]
## 
##     if
##  `total sulfur dioxide` <= 0.05019546
##  sulphates > -0.0465041
##     then
##  outcome = 6.9 + 0.796 `total sulfur dioxide` - 0.394 sulphates
##            - 0.026 `volatile acidity` - 0.015 `citric acid`
## 
##   Rule 97/9: [172 cases, mean 6.3, range 3 to 8, est err 1.1]
## 
##     if
##  `total sulfur dioxide` <= 0.05019546
##  alcohol > 0.6381389
##     then
##  outcome = 4 + 1.436 alcohol - 0.958 `volatile acidity`
##            + 0.722 `free sulfur dioxide` + 0.299 pH
## 
## Model 98:
## 
##   Rule 98/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 5 + 0.135 `fixed acidity` - 0.069 alcohol + 0.037 pH
##            - 0.03 `total sulfur dioxide` + 0.028 sulphates
## 
##   Rule 98/2: [150 cases, mean 5.6, range 3 to 8, est err 0.7]
## 
##     if
##  `fixed acidity` <= -0.669116
##  alcohol > -0.4265552
##     then
##  outcome = 4 - 1.042 `fixed acidity` - 0.696 density + 0.396 sulphates
##            - 0.354 `total sulfur dioxide` + 0.211 `residual sugar`
##            + 0.161 `free sulfur dioxide` + 0.023 alcohol - 0.018 pH
## 
##   Rule 98/3: [41 cases, mean 5.9, range 3 to 8, est err 1.1]
## 
##     if
##  pH > 1.588499
##  alcohol > -0.4265552
##     then
##  outcome = 7.6 - 1.373 pH + 0.845 sulphates + 0.841 alcohol
##            + 0.399 `volatile acidity`
## 
##   Rule 98/4: [372 cases, mean 6.0, range 3 to 8, est err 0.6]
## 
##     if
##  `fixed acidity` > -0.669116
##  alcohol > -0.4265552
##     then
##  outcome = 6.1 - 0.387 `fixed acidity` - 0.344 pH + 0.32 alcohol
##            + 0.19 `residual sugar` + 0.176 `citric acid` + 0.07 sulphates
##            - 0.047 `total sulfur dioxide`
## 
## Model 99:
## 
##   Rule 99/1: [12 cases, mean 5.3, range 3 to 6, est err 1.7]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  density > 1.350117
##  sulphates <= -0.0465041
##     then
##  outcome = 23.7 - 11.656 density - 2.926 `volatile acidity`
##            + 2.034 `free sulfur dioxide` + 1.064 `citric acid`
##            + 0.01 sulphates
## 
##   Rule 99/2: [230 cases, mean 5.3, range 4 to 8, est err 0.4]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` > 0.05019546
##     then
##  outcome = 5.3 - 0.27 `volatile acidity` - 0.104 `citric acid`
##            - 0.104 `total sulfur dioxide` + 0.091 `free sulfur dioxide`
## 
##   Rule 99/3: [468 cases, mean 5.3, range 3 to 7, est err 0.6]
## 
##     if
##  sulphates <= -0.3194155
##     then
##  outcome = 4.9 - 0.755 chlorides - 0.187 `volatile acidity`
##            - 0.089 density + 0.052 sulphates
##            - 0.045 `total sulfur dioxide`
## 
##   Rule 99/4: [15 cases, mean 5.5, range 3 to 6, est err 2.7]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  density <= 1.350117
##  alcohol <= -1.200878
##     then
##  outcome = 22.1 + 11.724 alcohol + 10.09 sulphates
##            - 6.945 `total sulfur dioxide` - 3.892 density
##            + 0.665 `volatile acidity` - 0.422 chlorides
## 
##   Rule 99/5: [333 cases, mean 5.5, range 3 to 8, est err 0.7]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  density <= 1.350117
##     then
##  outcome = 6 - 0.568 `volatile acidity` + 0.566 sulphates
##            + 0.489 `total sulfur dioxide` - 0.357 density
##            + 0.341 chlorides - 0.26 `citric acid`
## 
##   Rule 99/6: [463 cases, mean 5.5, range 3 to 8, est err 0.7]
## 
##     if
##  `total sulfur dioxide` <= 0.05019546
##  alcohol <= 0.5413485
##     then
##  outcome = 5.8 - 0.425 pH + 0.273 `total sulfur dioxide`
##            - 0.158 sulphates + 0.145 `free sulfur dioxide`
##            + 0.126 `fixed acidity`
## 
##   Rule 99/7: [31 cases, mean 5.7, range 5 to 7, est err 1.1]
## 
##     if
##  `fixed acidity` <= -0.7235644
##  `total sulfur dioxide` <= 0.05019546
##  sulphates > -0.0465041
##  alcohol <= 0.5413485
##     then
##  outcome = 12.3 + 4.096 `fixed acidity` + 2.446 `residual sugar`
##            - 2.195 chlorides + 1.221 alcohol - 0.988 pH
##            - 0.594 `total sulfur dioxide`
## 
##   Rule 99/8: [279 cases, mean 6.0, range 3 to 8, est err 0.6]
## 
##     if
##  `volatile acidity` <= -0.3264634
##  sulphates > -0.3194155
##     then
##  outcome = 5.1 - 0.948 `volatile acidity` - 0.254 `total sulfur dioxide`
##            + 0.087 sulphates - 0.053 chlorides
## 
##   Rule 99/9: [14 cases, mean 6.2, range 5 to 7, est err 1.0]
## 
##     if
##  `fixed acidity` > -0.7235644
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  pH > 0.005698082
##  sulphates > -0.0465041
##  alcohol <= 0.5413485
##     then
##  outcome = 7.3 + 0.557 `total sulfur dioxide` - 0.459 `volatile acidity`
##            - 0.268 `citric acid` + 0.256 sulphates + 0.147 alcohol
##            + 0.05 `free sulfur dioxide` + 0.033 `residual sugar`
## 
##   Rule 99/10: [34 cases, mean 6.3, range 5 to 8, est err 1.0]
## 
##     if
##  `volatile acidity` > -0.3264634
##  `total sulfur dioxide` <= 0.05019546
##  sulphates > -0.0465041
##  alcohol > 0.5413485
##     then
##  outcome = 7.4 + 3.078 `total sulfur dioxide` - 2.209 sulphates
##            + 1.276 alcohol - 1.031 density + 0.879 chlorides
##            + 0.622 `fixed acidity` - 0.486 `free sulfur dioxide`
## 
## Model 100:
## 
##   Rule 100/1: [478 cases, mean 5.3, range 3 to 8, est err 0.4]
## 
##     if
##  alcohol <= -0.4265552
##     then
##  outcome = 5 + 0.061 alcohol - 0.009 `total sulfur dioxide`
##            + 0.009 sulphates
## 
##   Rule 100/2: [150 cases, mean 5.6, range 3 to 8, est err 0.7]
## 
##     if
##  `fixed acidity` <= -0.669116
##  alcohol > -0.4265552
##     then
##  outcome = 4.8 - 0.676 density - 0.316 `total sulfur dioxide`
##            + 0.245 `residual sugar` + 0.22 `free sulfur dioxide`
##            + 0.068 alcohol - 0.022 pH
## 
##   Rule 100/3: [41 cases, mean 5.9, range 3 to 8, est err 0.9]
## 
##     if
##  pH > 1.588499
##  alcohol > -0.4265552
##     then
##  outcome = 8.1 - 1.381 pH + 0.842 alcohol
## 
##   Rule 100/4: [372 cases, mean 6.0, range 3 to 8, est err 0.7]
## 
##     if
##  `fixed acidity` > -0.669116
##  alcohol > -0.4265552
##     then
##  outcome = 6.2 - 0.487 `fixed acidity` + 0.402 alcohol
##            + 0.279 `citric acid` - 0.271 pH + 0.265 `residual sugar`
## 
## 
## Evaluation on training data (1000 cases):
## 
##     Average  |error|                0.4
##     Relative |error|               0.58
##     Correlation coefficient        0.65
## 
## 
##  Attribute usage:
##    Conds  Model
## 
##     51%    78%    alcohol
##     33%    61%    sulphates
##     19%    68%    `volatile acidity`
##     15%    74%    `total sulfur dioxide`
##      4%    67%    pH
##      3%    56%    `fixed acidity`
##      2%    22%    chlorides
##      1%    50%    `free sulfur dioxide`
##            42%    `citric acid`
##            28%    density
##            16%    `residual sugar`
## 
## 
## Time: 1.7 secs
wine_test$pred_qual_cube <- predict(m_cube, wine_test)

cor_cube <- cor(wine_test$quality, wine_test$pred_qual_cube)
mae_cube <- mean(abs(wine_test$quality - wine_test$pred_qual_cube))

point_cube <- point_plot(wine_test$pred_qual_cube) +
  ggtitle('Cubist')
box_cube <- box_plot(wine_test$pred_qual_cube) +
  ggtitle('Cubist')

cor_cube
## [1] 0.5624633
mae_cube
## [1] 0.530176
point_cube

box_cube

Running a Random Forest model

library(Rborist)

m_rf <- train(quality ~ .,
                   data = wine_train,
                   method = 'Rborist',
                   preProcess = c('scale', 'center'),
                   trControl = trainControl(method = 'repeatedcv', 
                                            number = 10, 
                                            repeats = 5, 
                                            verboseIter = FALSE),
                   tuneGrid = expand.grid(predFixed = seq(3, 9, 1),
                                          minNode = 10),
                   verbose = 0)
m_rf
## Random Forest 
## 
## 1000 samples
##   11 predictor
## 
## Pre-processing: scaled (11), centered (11) 
## Resampling: Cross-Validated (10 fold, repeated 5 times) 
## Summary of sample sizes: 901, 900, 899, 898, 900, 901, ... 
## Resampling results across tuning parameters:
## 
##   predFixed  RMSE       Rsquared   MAE      
##   3          0.5764165  0.4933442  0.4338325
##   4          0.5760806  0.4904814  0.4306947
##   5          0.5768387  0.4875412  0.4296986
##   6          0.5777603  0.4852401  0.4285138
##   7          0.5787188  0.4826285  0.4280338
##   8          0.5800355  0.4799378  0.4279244
##   9          0.5797685  0.4804046  0.4274214
## 
## Tuning parameter 'minNode' was held constant at a value of 10
## RMSE was used to select the optimal model using the smallest value.
## The final values used for the model were predFixed = 4 and minNode = 10.
summary(m_rf)
##             Length Class      Mode     
## bag          4     -none-     list     
## forest       4     Forest     list     
## leaf         5     LeafReg    list     
## signature    4     Signature  list     
## training     4     -none-     list     
## validation   6     ValidReg   list     
## xNames      11     -none-     character
## problemType  1     -none-     character
## tuneValue    2     data.frame list     
## obsLevels    1     -none-     logical  
## param        1     -none-     list
wine_test$pred_qual_rf <- predict(m_rf, wine_test)

cor_rf <- cor(wine_test$quality, wine_test$pred_qual_rf)
mae_rf <- mean(abs(wine_test$quality - wine_test$pred_qual_rf))

point_rf <- point_plot(wine_test$pred_qual_rf) +
  ggtitle('Random Forest')
box_rf <- box_plot(wine_test$pred_qual_rf) +
  ggtitle('Random Forest')

cor_rf
## [1] 0.598565
mae_rf
## [1] 0.5048614
point_rf

box_rf

Running a XGBoost model

# Gradient Boosting Machines

library(xgboost)
library(xgboostExplainer)

m_boosted <- train(quality ~ .,
                      data = wine_train,
                      method = 'xgbTree',
                      preProcess = c('scale', 'center'),
                      trControl = trainControl(method = 'repeatedcv', 
                                               number = 10, 
                                               repeats = 5, 
                                               verboseIter = FALSE),
                      tuneGrid = expand.grid(nrounds = 50,
                                             max_depth = seq(1, 7, 1),
                                             eta = c(0.1, 0.3, 0.5),
                                             gamma = 0,
                                             colsample_bytree = 0.8,
                                             min_child_weight = 10,
                                             subsample = seq(0.7, 1, 0.1)),
                      verbose = 0)
m_boosted
## eXtreme Gradient Boosting 
## 
## 1000 samples
##   11 predictor
## 
## Pre-processing: scaled (11), centered (11) 
## Resampling: Cross-Validated (10 fold, repeated 5 times) 
## Summary of sample sizes: 900, 901, 899, 899, 901, 901, ... 
## Resampling results across tuning parameters:
## 
##   eta  max_depth  subsample  RMSE       Rsquared   MAE      
##   0.1  1          0.7        0.6434453  0.3636873  0.5049529
##   0.1  1          0.8        0.6435024  0.3654492  0.5060536
##   0.1  1          0.9        0.6445464  0.3640850  0.5081617
##   0.1  1          1.0        0.6455508  0.3637558  0.5096574
##   0.1  2          0.7        0.6268323  0.3901041  0.4830764
##   0.1  2          0.8        0.6275553  0.3888022  0.4847840
##   0.1  2          0.9        0.6259237  0.3929673  0.4831835
##   0.1  2          1.0        0.6285523  0.3880144  0.4855403
##   0.1  3          0.7        0.6192597  0.4045866  0.4748875
##   0.1  3          0.8        0.6194035  0.4045501  0.4747077
##   0.1  3          0.9        0.6202781  0.4023030  0.4758910
##   0.1  3          1.0        0.6217713  0.3998400  0.4762402
##   0.1  4          0.7        0.6145349  0.4131933  0.4669363
##   0.1  4          0.8        0.6105250  0.4211966  0.4646833
##   0.1  4          0.9        0.6123322  0.4170421  0.4647302
##   0.1  4          1.0        0.6140772  0.4149551  0.4671257
##   0.1  5          0.7        0.6086202  0.4245272  0.4609219
##   0.1  5          0.8        0.6043586  0.4330712  0.4554612
##   0.1  5          0.9        0.6047603  0.4322966  0.4571327
##   0.1  5          1.0        0.6061954  0.4291434  0.4554826
##   0.1  6          0.7        0.6060174  0.4299503  0.4561986
##   0.1  6          0.8        0.5996665  0.4414848  0.4503093
##   0.1  6          0.9        0.6007649  0.4399261  0.4497331
##   0.1  6          1.0        0.6009660  0.4388358  0.4486667
##   0.1  7          0.7        0.5985411  0.4433455  0.4468239
##   0.1  7          0.8        0.5976411  0.4453413  0.4444722
##   0.1  7          0.9        0.5973929  0.4460936  0.4445854
##   0.1  7          1.0        0.5967966  0.4471956  0.4415343
##   0.3  1          0.7        0.6392338  0.3634659  0.4915839
##   0.3  1          0.8        0.6380712  0.3659739  0.4916405
##   0.3  1          0.9        0.6375932  0.3669022  0.4914972
##   0.3  1          1.0        0.6374362  0.3669276  0.4917025
##   0.3  2          0.7        0.6319912  0.3811148  0.4851904
##   0.3  2          0.8        0.6290664  0.3863312  0.4796860
##   0.3  2          0.9        0.6301468  0.3840818  0.4808641
##   0.3  2          1.0        0.6275591  0.3884499  0.4805025
##   0.3  3          0.7        0.6308942  0.3870082  0.4778396
##   0.3  3          0.8        0.6290760  0.3916112  0.4755983
##   0.3  3          0.9        0.6214817  0.4029253  0.4702691
##   0.3  3          1.0        0.6210039  0.4026569  0.4679967
##   0.3  4          0.7        0.6240565  0.4032619  0.4687603
##   0.3  4          0.8        0.6270070  0.3975950  0.4668014
##   0.3  4          0.9        0.6240267  0.4021858  0.4620980
##   0.3  4          1.0        0.6148588  0.4178558  0.4574530
##   0.3  5          0.7        0.6237002  0.4102358  0.4596812
##   0.3  5          0.8        0.6153706  0.4209916  0.4512763
##   0.3  5          0.9        0.6178283  0.4165636  0.4502845
##   0.3  5          1.0        0.6075919  0.4328597  0.4431816
##   0.3  6          0.7        0.6205017  0.4180133  0.4525054
##   0.3  6          0.8        0.6234362  0.4122647  0.4529924
##   0.3  6          0.9        0.6141005  0.4262706  0.4412378
##   0.3  6          1.0        0.6057385  0.4366085  0.4340595
##   0.3  7          0.7        0.6248214  0.4135070  0.4459634
##   0.3  7          0.8        0.6105617  0.4334162  0.4350780
##   0.3  7          0.9        0.6103528  0.4349369  0.4306047
##   0.3  7          1.0        0.6101075  0.4343774  0.4316877
##   0.5  1          0.7        0.6486374  0.3490566  0.4988988
##   0.5  1          0.8        0.6484741  0.3492474  0.4971950
##   0.5  1          0.9        0.6452004  0.3542547  0.4945091
##   0.5  1          1.0        0.6424581  0.3579741  0.4931148
##   0.5  2          0.7        0.6557615  0.3491868  0.4977812
##   0.5  2          0.8        0.6455146  0.3648922  0.4925026
##   0.5  2          0.9        0.6478325  0.3598787  0.4919684
##   0.5  2          1.0        0.6415812  0.3671550  0.4879945
##   0.5  3          0.7        0.6613319  0.3520898  0.4981891
##   0.5  3          0.8        0.6480271  0.3703578  0.4870550
##   0.5  3          0.9        0.6410621  0.3801933  0.4809871
##   0.5  3          1.0        0.6377800  0.3825052  0.4745120
##   0.5  4          0.7        0.6603657  0.3641750  0.4873475
##   0.5  4          0.8        0.6494323  0.3784335  0.4735826
##   0.5  4          0.9        0.6362166  0.3965045  0.4630967
##   0.5  4          1.0        0.6313947  0.4001990  0.4586015
##   0.5  5          0.7        0.6511628  0.3871839  0.4694408
##   0.5  5          0.8        0.6510524  0.3844509  0.4694947
##   0.5  5          0.9        0.6455713  0.3939347  0.4596788
##   0.5  5          1.0        0.6367033  0.3968691  0.4511865
##   0.5  6          0.7        0.6550404  0.3843467  0.4643282
##   0.5  6          0.8        0.6443925  0.3966157  0.4532832
##   0.5  6          0.9        0.6418493  0.3985415  0.4493771
##   0.5  6          1.0        0.6274551  0.4161873  0.4353702
##   0.5  7          0.7        0.6641240  0.3741354  0.4654233
##   0.5  7          0.8        0.6461578  0.3986420  0.4490531
##   0.5  7          0.9        0.6453067  0.3946851  0.4429290
##   0.5  7          1.0        0.6314410  0.4137659  0.4356340
## 
## Tuning parameter 'nrounds' was held constant at a value of 50
## Tuning
##  parameter 'colsample_bytree' was held constant at a value of 0.8
## 
## Tuning parameter 'min_child_weight' was held constant at a value of 10
## RMSE was used to select the optimal model using the smallest value.
## The final values used for the model were nrounds = 50, max_depth = 7, eta
##  = 0.1, gamma = 0, colsample_bytree = 0.8, min_child_weight = 10 and
##  subsample = 1.
summary(m_boosted)
##               Length Class              Mode       
## handle            1  xgb.Booster.handle externalptr
## raw           90183  -none-             raw        
## niter             1  -none-             numeric    
## call              6  -none-             call       
## params            8  -none-             list       
## callbacks         0  -none-             list       
## feature_names    11  -none-             character  
## nfeatures         1  -none-             numeric    
## xNames           11  -none-             character  
## problemType       1  -none-             character  
## tuneValue         7  data.frame         list       
## obsLevels         1  -none-             logical    
## param             1  -none-             list
wine_test$pred_qual_xgbt <- predict(m_boosted, wine_test)

cor_xgbt <- cor(wine_test$quality, wine_test$pred_qual_xgbt)
mae_xgbt <- mean(abs(wine_test$quality - wine_test$pred_qual_xgbt))

point_xgbt <- point_plot(wine_test$pred_qual_xgbt) +
  ggtitle('XGBoost')
box_xgbt <- box_plot(wine_test$pred_qual_xgbt) +
  ggtitle('XGBoost')

cor_xgbt
## [1] 0.5816026
mae_xgbt
## [1] 0.5120226
point_xgbt

box_xgbt

Comparing fit of the models.

# Comparing

Fit_Trees <- tibble(Method = c('GLM', 'Bayesian GLM', 'Lasso', 'Cubist', 'Random Forest', 'XGBoost'),
                    Correlation = c(cor_glm, cor_bglm, cor_lss, cor_cube, cor_rf, cor_xgbt),
                    MAE = c(mae_glm, mae_bglm, mae_lss, mae_cube, mae_rf, mae_xgbt))

library(patchwork)

Fit_Trees
## # A tibble: 6 x 3
##   Method        Correlation   MAE
##   <chr>               <dbl> <dbl>
## 1 GLM                 0.589 0.508
## 2 Bayesian GLM        0.589 0.508
## 3 Lasso               0.588 0.509
## 4 Cubist              0.562 0.530
## 5 Random Forest       0.599 0.505
## 6 XGBoost             0.582 0.512
Best_Fit <- Fit_Trees %>%
  filter(Correlation == max(Correlation)) %>%
  select(Method)

point_glm + point_bglm + point_lss +
  point_cube + point_rf + point_xgbt +
  box_glm + box_bglm + box_lss +
  box_cube + box_rf + box_xgbt +
  plot_layout(ncol = 3)

The method with best fit was:

Best_Fit
## # A tibble: 1 x 1
##   Method       
##   <chr>        
## 1 Random Forest