#Set the working directory
setwd("C:/Users/jyqq9/Desktop/STA 108/Project 2")

#Read in the data from the text file
mydata = read.table("diabetes.txt", header=T)

#Examine the data
head(mydata)
dim(mydata)
## [1] 366  16
#1
#The quantiative variables are chol, stab.glu, hdl, ratio, glyhb, age, height, weight,
#bp.1s, bp.1d, waist, hip, time.ppn. The qualitative variables are location, gender, and frame.

#histogram for each quantiative variable
#chol's distribution
quantvar1 = subset(mydata, select = c(chol))
hist(quantvar1$chol)

#stab.glu's distribution
quantvar2 = subset(mydata, select = c(stab.glu))
hist(quantvar2$stab.glu)

#hdl's distribution
quantvar3 = subset(mydata, select = c(hdl))
hist(quantvar3$hdl)

#ratio's distribution
quantvar4 = subset(mydata, select = c(ratio))
hist(quantvar4$ratio)

#glyhb's distribution
quantvar5 = subset(mydata, select = c(glyhb))
hist(quantvar5$glyhb)

#age's distribution
quantvar6 = subset(mydata, select = c(age))
hist(quantvar6$age)

#height's distribution
quantvar7 = subset(mydata, select = c(height))
hist(quantvar7$height)

#weight's distribution
quantvar8 = subset(mydata, select = c(weight))
hist(quantvar8$weight)

#bp.1s' distribution
quantvar9 = subset(mydata, select = c(bp.1s))
hist(quantvar9$bp.1s)

#bp.1d's distribution
quantvar10 = subset(mydata, select = c(bp.1d))
hist(quantvar10$bp.1d)

#waist's distribution
quantvar11 = subset(mydata, select = c(waist))
hist(quantvar11$waist)

#hip's distribution
quantvar12 = subset(mydata, select = c(hip))
hist(quantvar12$hip)

#time.ppn's distribution
quantvar13 = subset(mydata, select = c(time.ppn))
hist(quantvar13$time.ppn)

#pie chart for each qualitative variable
#Load MASS package for the table function
library(MASS)

#location's distribution
qualvar1 = subset(mydata, select = c(location))
location = qualvar1$location
location.pie = table(location)
pie(location.pie)

#gender's distribution
qualvar2 = subset(mydata, select = c(gender))
gender = qualvar2$gender
gender.pie = table(gender)
pie(gender.pie)

#frame's distribution
qualvar3 = subset(mydata, select = c(frame))
frame = qualvar3$frame
frame.pie = table(frame)
pie(frame.pie)

#draw a scatterplot matrix and obtain the pairwise correlation matrix for all
#quantiative variables in the data
quantvarmatrix = mydata[c(1:5,7,9:10,12:16)]
pairs(quantvarmatrix)

#2
#regress glybh on all predictor variables
Model1 = lm(glyhb~.,data=mydata)
plot(Model1)

#3
library(MASS)
boxcox(mydata$glyhb~.,data=mydata)

Model2 = lm(1/mydata$glyhb~., data=mydata)
plot(Model2)

boxcox(Model2)

#4
set.seed(10) #set seed for random number generator
            #so everyone gets the same split of the data.
N=nrow(mydata) #number of observations in the data 
index=sample(1:N, size=N/2, replace=FALSE) #randomly sample 
                #N/2 observation to form the training data.
data.t=mydata[index,] #get the training data set
data.v=mydata[-index,] #the remaining N/2 observations form the validation set

#5
Model3 = lm(1/data.t$glyhb~., data=data.t)
summary(Model3)
## 
## Call:
## lm(formula = 1/data.t$glyhb ~ ., data = data.t)
## 
## Residuals:
##       Min        1Q    Median        3Q       Max 
## -0.097813 -0.022472 -0.002034  0.021097  0.134611 
## 
## Coefficients:
##                  Estimate Std. Error t value Pr(>|t|)    
## (Intercept)     4.819e-01  8.499e-02   5.670 6.19e-08 ***
## chol           -6.857e-05  1.695e-04  -0.405   0.6863    
## stab.glu       -5.314e-04  5.418e-05  -9.807  < 2e-16 ***
## hdl             1.211e-04  5.492e-04   0.220   0.8258    
## ratio          -2.414e-03  6.588e-03  -0.366   0.7145    
## locationLouisa -1.808e-03  5.969e-03  -0.303   0.7623    
## age            -5.487e-04  2.199e-04  -2.495   0.0136 *  
## gendermale     -7.422e-04  1.018e-02  -0.073   0.9420    
## height         -1.212e-03  1.123e-03  -1.079   0.2820    
## weight          2.210e-04  2.034e-04   1.087   0.2788    
## framemedium     1.417e-03  7.861e-03   0.180   0.8572    
## framesmall     -1.062e-02  9.596e-03  -1.107   0.2699    
## bp.1s          -1.214e-04  1.708e-04  -0.711   0.4782    
## bp.1d           3.198e-05  2.505e-04   0.128   0.8986    
## waist          -1.893e-03  1.148e-03  -1.649   0.1010    
## hip            -1.177e-03  1.352e-03  -0.870   0.3854    
## time.ppn       -1.444e-05  9.881e-06  -1.461   0.1459    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 0.0372 on 166 degrees of freedom
## Multiple R-squared:  0.5547, Adjusted R-squared:  0.5118 
## F-statistic: 12.92 on 16 and 166 DF,  p-value: < 2.2e-16
length(Model3$coefficients) #of regression coefficients
## [1] 17
summary(Model3)$sigma^2 #MSE from this model
## [1] 0.001383855
#6
library(leaps)
best = regsubsets(1/data.t$glyhb~., data=data.t, nbest=1, nvmax=16)
sum_sub=summary(best)
sum_sub$which
##    (Intercept)  chol stab.glu   hdl ratio locationLouisa   age gendermale
## 1         TRUE FALSE     TRUE FALSE FALSE          FALSE FALSE      FALSE
## 2         TRUE FALSE     TRUE FALSE FALSE          FALSE  TRUE      FALSE
## 3         TRUE FALSE     TRUE FALSE FALSE          FALSE  TRUE      FALSE
## 4         TRUE FALSE     TRUE FALSE  TRUE          FALSE  TRUE      FALSE
## 5         TRUE FALSE     TRUE FALSE  TRUE          FALSE  TRUE      FALSE
## 6         TRUE FALSE     TRUE FALSE  TRUE          FALSE  TRUE      FALSE
## 7         TRUE FALSE     TRUE FALSE  TRUE          FALSE  TRUE      FALSE
## 8         TRUE FALSE     TRUE FALSE  TRUE          FALSE  TRUE      FALSE
## 9         TRUE FALSE     TRUE FALSE  TRUE          FALSE  TRUE      FALSE
## 10        TRUE FALSE     TRUE FALSE  TRUE          FALSE  TRUE      FALSE
## 11        TRUE  TRUE     TRUE FALSE  TRUE          FALSE  TRUE      FALSE
## 12        TRUE  TRUE     TRUE FALSE  TRUE           TRUE  TRUE      FALSE
## 13        TRUE  TRUE     TRUE  TRUE  TRUE           TRUE  TRUE      FALSE
## 14        TRUE  TRUE     TRUE  TRUE  TRUE           TRUE  TRUE      FALSE
## 15        TRUE  TRUE     TRUE  TRUE  TRUE           TRUE  TRUE      FALSE
## 16        TRUE  TRUE     TRUE  TRUE  TRUE           TRUE  TRUE       TRUE
##    height weight framemedium framesmall bp.1s bp.1d waist   hip time.ppn
## 1   FALSE  FALSE       FALSE      FALSE FALSE FALSE FALSE FALSE    FALSE
## 2   FALSE  FALSE       FALSE      FALSE FALSE FALSE FALSE FALSE    FALSE
## 3   FALSE  FALSE       FALSE      FALSE FALSE FALSE  TRUE FALSE    FALSE
## 4   FALSE  FALSE       FALSE      FALSE FALSE FALSE  TRUE FALSE    FALSE
## 5   FALSE  FALSE       FALSE       TRUE FALSE FALSE  TRUE FALSE    FALSE
## 6   FALSE  FALSE       FALSE       TRUE FALSE FALSE  TRUE FALSE     TRUE
## 7   FALSE  FALSE       FALSE       TRUE  TRUE FALSE  TRUE FALSE     TRUE
## 8    TRUE  FALSE       FALSE       TRUE  TRUE FALSE  TRUE FALSE     TRUE
## 9    TRUE   TRUE       FALSE       TRUE FALSE FALSE  TRUE  TRUE     TRUE
## 10   TRUE   TRUE       FALSE       TRUE  TRUE FALSE  TRUE  TRUE     TRUE
## 11   TRUE   TRUE       FALSE       TRUE  TRUE FALSE  TRUE  TRUE     TRUE
## 12   TRUE   TRUE       FALSE       TRUE  TRUE FALSE  TRUE  TRUE     TRUE
## 13   TRUE   TRUE       FALSE       TRUE  TRUE FALSE  TRUE  TRUE     TRUE
## 14   TRUE   TRUE        TRUE       TRUE  TRUE FALSE  TRUE  TRUE     TRUE
## 15   TRUE   TRUE        TRUE       TRUE  TRUE  TRUE  TRUE  TRUE     TRUE
## 16   TRUE   TRUE        TRUE       TRUE  TRUE  TRUE  TRUE  TRUE     TRUE
n=nrow(data.t)
n
## [1] 183
p.m=2:17
sse=sum_sub$rss
sse
##  [1] 0.2864076 0.2574112 0.2428890 0.2401432 0.2367131 0.2343460 0.2331725
##  [8] 0.2326634 0.2314193 0.2303187 0.2300477 0.2299216 0.2298166 0.2297510
## [15] 0.2297274 0.2297200
aic=n*log(sse)+2*p.m-n*log(n)
aic
##  [1] -1178.148 -1195.682 -1204.309 -1204.389 -1205.022 -1204.861 -1203.780
##  [8] -1202.180 -1201.161 -1200.033 -1198.249 -1196.349 -1194.433 -1192.485
## [15] -1190.504 -1188.510
bic=n*log(sse)+log(n)*p.m-n*log(n)
bic
##  [1] -1171.729 -1186.053 -1191.471 -1188.342 -1185.765 -1182.395 -1178.104
##  [8] -1173.294 -1169.066 -1164.729 -1159.735 -1154.626 -1149.500 -1144.343
## [15] -1139.152 -1133.948
res_sub=cbind(sum_sub$which,sse,sum_sub$rsq,sum_sub$adjr2,sum_sub$cp,aic, bic)
fit0=lm(1/data.t$glyhb~1,data=data.t) # fit the model with only intercept
sse1=sum(fit0$residuals^2)
p=1
c1=sse1/0.001384-(n-2*p)
aic1=n*log(sse1)+2*p-n*log(n)
bic1=n*log(sse1)+log(n)*p-n*log(n)
none=c(1,rep(0,16),sse1,0,0,c1,aic1,bic1)
res_sub=rbind(none,res_sub) # combine the results with other models
colnames(res_sub)=c(colnames(sum_sub$which),"sse", "R^2", "R^2_a", "Cp", "aic", "bic")
res_sub
##      (Intercept) chol stab.glu hdl ratio locationLouisa age gendermale
## none           1    0        0   0     0              0   0          0
## 1              1    0        1   0     0              0   0          0
## 2              1    0        1   0     0              0   1          0
## 3              1    0        1   0     0              0   1          0
## 4              1    0        1   0     1              0   1          0
## 5              1    0        1   0     1              0   1          0
## 6              1    0        1   0     1              0   1          0
## 7              1    0        1   0     1              0   1          0
## 8              1    0        1   0     1              0   1          0
## 9              1    0        1   0     1              0   1          0
## 10             1    0        1   0     1              0   1          0
## 11             1    1        1   0     1              0   1          0
## 12             1    1        1   0     1              1   1          0
## 13             1    1        1   1     1              1   1          0
## 14             1    1        1   1     1              1   1          0
## 15             1    1        1   1     1              1   1          0
## 16             1    1        1   1     1              1   1          1
##      height weight framemedium framesmall bp.1s bp.1d waist hip time.ppn
## none      0      0           0          0     0     0     0   0        0
## 1         0      0           0          0     0     0     0   0        0
## 2         0      0           0          0     0     0     0   0        0
## 3         0      0           0          0     0     0     1   0        0
## 4         0      0           0          0     0     0     1   0        0
## 5         0      0           0          1     0     0     1   0        0
## 6         0      0           0          1     0     0     1   0        1
## 7         0      0           0          1     1     0     1   0        1
## 8         1      0           0          1     1     0     1   0        1
## 9         1      1           0          1     0     0     1   1        1
## 10        1      1           0          1     1     0     1   1        1
## 11        1      1           0          1     1     0     1   1        1
## 12        1      1           0          1     1     0     1   1        1
## 13        1      1           0          1     1     0     1   1        1
## 14        1      1           1          1     1     0     1   1        1
## 15        1      1           1          1     1     1     1   1        1
## 16        1      1           1          1     1     1     1   1        1
##            sse       R^2     R^2_a           Cp       aic       bic
## none 0.5158646 0.0000000 0.0000000 191.73453170 -1072.466 -1069.256
## 1    0.2864076 0.4448009 0.4417335  27.96351331 -1178.148 -1171.729
## 2    0.2574112 0.5010102 0.4954659   9.01014928 -1195.682 -1186.053
## 3    0.2428890 0.5291612 0.5212701   0.51619889 -1204.309 -1191.471
## 4    0.2401432 0.5344840 0.5240230   0.53201659 -1204.389 -1188.342
## 5    0.2367131 0.5411332 0.5281708   0.05337754 -1205.022 -1185.765
## 6    0.2343460 0.5457220 0.5302352   0.34280455 -1204.861 -1182.395
## 7    0.2331725 0.5479966 0.5299165   1.49487219 -1203.780 -1178.104
## 8    0.2326634 0.5489836 0.5282473   3.12693590 -1202.180 -1173.294
## 9    0.2314193 0.5513952 0.5280574   4.22797088 -1201.161 -1169.066
## 10   0.2303187 0.5535287 0.5275711   5.43265348 -1200.033 -1164.729
## 11   0.2300477 0.5540541 0.5253676   7.23678869 -1198.249 -1159.735
## 12   0.2299216 0.5542986 0.5228374   9.14564365 -1196.349 -1154.626
## 13   0.2298166 0.5545020 0.5202329  11.06983181 -1194.433 -1149.500
## 14   0.2297510 0.5546292 0.5175150  13.02241521 -1192.485 -1144.343
## 15   0.2297274 0.5546751 0.5146758  15.00531267 -1190.504 -1139.152
## 16   0.2297200 0.5546893 0.5117678  17.00000000 -1188.510 -1133.948
#Model 3.1, 3.2, 3.3
#Create qualitative variable framesmall
is.factor(data.t[,11]) #TRUE
## [1] TRUE
summary(data.t$frame)
##  large medium  small 
##     46     89     48
small.index=which(data.t$frame=="small")
small.index #observations of frame = small
##  [1]   1   4   6   7  15  16  21  30  33  35  36  40  51  52  64  68  73
## [18]  77  79  81  84  87  92  95  99 100 117 119 120 125 127 132 133 137
## [35] 139 141 146 148 159 162 166 167 168 170 172 177 180 182
#data.t[1:11]
n=dim(data.t)[1]
X11s=rep(0,n)
X11s[small.index]=1 #small = 1, rest are 0

Model3.1=lm(1/data.t$glyhb ~ stab.glu + ratio + age + X11s + waist,data=data.t) #AIC selected
Model3.2=lm(1/data.t$glyhb~.,data=data.t[c(2,7,14)]) #BIC selected
Model3.3=lm(1/data.t$glyhb~ stab.glu + ratio + age + X11s + waist + time.ppn,data=data.t) #AdjR^2 selected

#7
Model4=lm(1/data.t$glyhb~.^2,data=data.t)
length(Model4$coefficients) #136
## [1] 136
summary(Model4)$sigma^2 #0.001036088
## [1] 0.001036088
#8
#fit0=lm(1/mydata$glyhb~1,data=mydata)
fit0=lm(1/data.t$glyhb~1,data=data.t)
fs1=stepAIC(fit0,scope=list(upper=Model4,lower=~1),direction="both",k=2)
## Start:  AIC=-1072.47
## 1/data.t$glyhb ~ 1
## 
##            Df Sum of Sq     RSS     AIC
## + stab.glu  1  0.229457 0.28641 -1178.2
## + age       1  0.080171 0.43569 -1101.4
## + ratio     1  0.062778 0.45309 -1094.2
## + waist     1  0.055768 0.46010 -1091.4
## + hdl       1  0.026343 0.48952 -1080.1
## + bp.1s     1  0.026201 0.48966 -1080.0
## + hip       1  0.022197 0.49367 -1078.5
## + chol      1  0.020540 0.49533 -1077.9
## + weight    1  0.019826 0.49604 -1077.6
## + frame     2  0.024818 0.49105 -1077.5
## <none>                  0.51586 -1072.5
## + bp.1d     1  0.001406 0.51446 -1071.0
## + gender    1  0.001168 0.51470 -1070.9
## + height    1  0.000406 0.51546 -1070.6
## + time.ppn  1  0.000253 0.51561 -1070.6
## + location  1  0.000223 0.51564 -1070.5
## 
## Step:  AIC=-1178.15
## 1/data.t$glyhb ~ stab.glu
## 
##            Df Sum of Sq     RSS     AIC
## + age       1  0.028996 0.25741 -1195.7
## + waist     1  0.022234 0.26417 -1190.9
## + ratio     1  0.012237 0.27417 -1184.1
## + hip       1  0.010172 0.27624 -1182.8
## + bp.1s     1  0.010011 0.27640 -1182.7
## + chol      1  0.007447 0.27896 -1181.0
## + weight    1  0.005955 0.28045 -1180.0
## + hdl       1  0.003151 0.28326 -1178.2
## <none>                  0.28641 -1178.2
## + time.ppn  1  0.001218 0.28519 -1176.9
## + bp.1d     1  0.001132 0.28528 -1176.9
## + frame     2  0.003582 0.28283 -1176.5
## + location  1  0.000158 0.28625 -1176.2
## + height    1  0.000008 0.28640 -1176.2
## + gender    1  0.000005 0.28640 -1176.2
## - stab.glu  1  0.229457 0.51586 -1072.5
## 
## Step:  AIC=-1195.68
## 1/data.t$glyhb ~ stab.glu + age
## 
##                Df Sum of Sq     RSS     AIC
## + waist         1  0.014522 0.24289 -1204.3
## + hip           1  0.010402 0.24701 -1201.2
## + weight        1  0.008376 0.24904 -1199.7
## + ratio         1  0.007022 0.25039 -1198.7
## + hdl           1  0.003946 0.25347 -1196.5
## + stab.glu:age  1  0.002815 0.25460 -1195.7
## <none>                      0.25741 -1195.7
## + chol          1  0.001726 0.25568 -1194.9
## + bp.1s         1  0.000870 0.25654 -1194.3
## + time.ppn      1  0.000797 0.25661 -1194.2
## + bp.1d         1  0.000563 0.25685 -1194.1
## + height        1  0.000525 0.25689 -1194.1
## + gender        1  0.000041 0.25737 -1193.7
## + location      1  0.000012 0.25740 -1193.7
## + frame         2  0.001194 0.25622 -1192.5
## - age           1  0.028996 0.28641 -1178.2
## - stab.glu      1  0.178283 0.43569 -1101.4
## 
## Step:  AIC=-1204.31
## 1/data.t$glyhb ~ stab.glu + age + waist
## 
##                  Df Sum of Sq     RSS     AIC
## + ratio           1  0.002746 0.24014 -1204.4
## <none>                        0.24289 -1204.3
## + stab.glu:age    1  0.002150 0.24074 -1203.9
## + time.ppn        1  0.001329 0.24156 -1203.3
## + chol            1  0.001173 0.24172 -1203.2
## + hdl             1  0.000947 0.24194 -1203.0
## + weight          1  0.000556 0.24233 -1202.7
## + bp.1s           1  0.000492 0.24240 -1202.7
## + height          1  0.000432 0.24246 -1202.6
## + age:waist       1  0.000080 0.24281 -1202.4
## + stab.glu:waist  1  0.000070 0.24282 -1202.4
## + bp.1d           1  0.000046 0.24284 -1202.3
## + gender          1  0.000037 0.24285 -1202.3
## + hip             1  0.000009 0.24288 -1202.3
## + location        1  0.000007 0.24288 -1202.3
## + frame           2  0.002491 0.24040 -1202.2
## - waist           1  0.014522 0.25741 -1195.7
## - age             1  0.021285 0.26417 -1190.9
## - stab.glu        1  0.160773 0.40366 -1113.3
## 
## Step:  AIC=-1204.39
## 1/data.t$glyhb ~ stab.glu + age + waist + ratio
## 
##                  Df Sum of Sq     RSS     AIC
## + stab.glu:ratio  1  0.003551 0.23659 -1205.1
## <none>                        0.24014 -1204.4
## - ratio           1  0.002746 0.24289 -1204.3
## + stab.glu:age    1  0.002386 0.23776 -1204.2
## + time.ppn        1  0.001658 0.23849 -1203.7
## + frame           2  0.003514 0.23663 -1203.1
## + ratio:age       1  0.000902 0.23924 -1203.1
## + weight          1  0.000726 0.23942 -1202.9
## + bp.1s           1  0.000666 0.23948 -1202.9
## + height          1  0.000443 0.23970 -1202.7
## + chol            1  0.000173 0.23997 -1202.5
## + stab.glu:waist  1  0.000149 0.23999 -1202.5
## + hdl             1  0.000104 0.24004 -1202.5
## + age:waist       1  0.000079 0.24006 -1202.5
## + hip             1  0.000052 0.24009 -1202.4
## + bp.1d           1  0.000038 0.24011 -1202.4
## + location        1  0.000005 0.24014 -1202.4
## + ratio:waist     1  0.000001 0.24014 -1202.4
## + gender          1  0.000000 0.24014 -1202.4
## - waist           1  0.010246 0.25039 -1198.7
## - age             1  0.019240 0.25938 -1192.3
## - stab.glu        1  0.142762 0.38291 -1121.0
## 
## Step:  AIC=-1205.12
## 1/data.t$glyhb ~ stab.glu + age + waist + ratio + stab.glu:ratio
## 
##                  Df Sum of Sq     RSS     AIC
## + ratio:age       1 0.0026083 0.23398 -1205.1
## <none>                        0.23659 -1205.1
## + time.ppn        1 0.0017079 0.23489 -1204.4
## - stab.glu:ratio  1 0.0035506 0.24014 -1204.4
## + height          1 0.0009334 0.23566 -1203.8
## + frame           2 0.0033195 0.23327 -1203.7
## + bp.1s           1 0.0007466 0.23585 -1203.7
## + stab.glu:age    1 0.0006609 0.23593 -1203.6
## + stab.glu:waist  1 0.0005916 0.23600 -1203.6
## + weight          1 0.0003696 0.23622 -1203.4
## + hdl             1 0.0003115 0.23628 -1203.4
## + age:waist       1 0.0002539 0.23634 -1203.3
## + chol            1 0.0001931 0.23640 -1203.3
## + ratio:waist     1 0.0001590 0.23643 -1203.2
## + bp.1d           1 0.0000799 0.23651 -1203.2
## + gender          1 0.0000593 0.23653 -1203.2
## + hip             1 0.0000130 0.23658 -1203.1
## + location        1 0.0000113 0.23658 -1203.1
## - waist           1 0.0086327 0.24522 -1200.6
## - age             1 0.0184053 0.25500 -1193.4
## 
## Step:  AIC=-1205.14
## 1/data.t$glyhb ~ stab.glu + age + waist + ratio + stab.glu:ratio + 
##     age:ratio
## 
##                  Df Sum of Sq     RSS     AIC
## <none>                        0.23398 -1205.1
## - age:ratio       1 0.0026083 0.23659 -1205.1
## + time.ppn        1 0.0019693 0.23201 -1204.7
## + stab.glu:age    1 0.0011229 0.23286 -1204.0
## + height          1 0.0010043 0.23298 -1203.9
## + bp.1s           1 0.0005834 0.23340 -1203.6
## + hdl             1 0.0004351 0.23355 -1203.5
## + stab.glu:waist  1 0.0004169 0.23357 -1203.5
## + chol            1 0.0002772 0.23371 -1203.4
## + weight          1 0.0002713 0.23371 -1203.4
## + frame           2 0.0027231 0.23126 -1203.3
## + gender          1 0.0001272 0.23386 -1203.2
## + bp.1d           1 0.0000804 0.23390 -1203.2
## + age:waist       1 0.0000781 0.23391 -1203.2
## + location        1 0.0000033 0.23398 -1203.2
## + hip             1 0.0000016 0.23398 -1203.1
## + ratio:waist     1 0.0000012 0.23398 -1203.1
## - stab.glu:ratio  1 0.0052565 0.23924 -1203.1
## - waist           1 0.0087815 0.24277 -1200.4
# Step:  AIC=-1205.14
# 1/data.t$glyhb ~ stab.glu + age + waist + ratio + stab.glu:ratio + 
#   age:ratio
sse.fs1=sum(fs1$residuals^2)
p.fs1=length(fs1$coefficients)

#9
fs2=stepAIC(Model3,scope=list(upper=Model4,lower=~1),direction="both",k=2)
## Start:  AIC=-1188.51
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + location + age + 
##     gender + height + weight + frame + bp.1s + bp.1d + waist + 
##     hip + time.ppn
## 
##                     Df Sum of Sq     RSS     AIC
## + stab.glu:gender    1  0.013316 0.21640 -1197.4
## + location:bp.1d     1  0.010440 0.21928 -1195.0
## + hdl:ratio          1  0.009066 0.22065 -1193.9
## + stab.glu:height    1  0.008303 0.22142 -1193.2
## + location:frame     2  0.009031 0.22069 -1191.8
## + age:bp.1d          1  0.006229 0.22349 -1191.5
## + hip:time.ppn       1  0.005986 0.22373 -1191.3
## - gender             1  0.000007 0.22973 -1190.5
## - bp.1d              1  0.000023 0.22974 -1190.5
## + stab.glu:hip       1  0.004944 0.22478 -1190.5
## - hdl                1  0.000067 0.22979 -1190.5
## - location           1  0.000127 0.22985 -1190.4
## - ratio              1  0.000186 0.22991 -1190.4
## - chol               1  0.000226 0.22995 -1190.3
## - bp.1s              1  0.000699 0.23042 -1190.0
## - hip                1  0.001048 0.23077 -1189.7
## - frame              2  0.003742 0.23346 -1189.5
## + bp.1d:time.ppn     1  0.003542 0.22618 -1189.3
## + bp.1s:waist        1  0.003419 0.22630 -1189.2
## + stab.glu:ratio     1  0.003414 0.22631 -1189.2
## - height             1  0.001612 0.23133 -1189.2
## - weight             1  0.001634 0.23135 -1189.2
## + stab.glu:age       1  0.003176 0.22654 -1189.1
## + hdl:age            1  0.003174 0.22655 -1189.1
## + waist:time.ppn     1  0.003169 0.22655 -1189.0
## + weight:bp.1s       1  0.003017 0.22670 -1188.9
## + location:gender    1  0.002816 0.22690 -1188.8
## + stab.glu:hdl       1  0.002762 0.22696 -1188.7
## + weight:time.ppn    1  0.002702 0.22702 -1188.7
## + hdl:weight         1  0.002629 0.22709 -1188.6
## + gender:height      1  0.002607 0.22711 -1188.6
## + gender:time.ppn    1  0.002600 0.22712 -1188.6
## + bp.1s:hip          1  0.002546 0.22717 -1188.5
## + hdl:frame          2  0.004991 0.22473 -1188.5
## <none>                           0.22972 -1188.5
## + bp.1s:time.ppn     1  0.002322 0.22740 -1188.4
## - time.ppn           1  0.002954 0.23267 -1188.2
## + stab.glu:frame     2  0.004473 0.22525 -1188.1
## + location:waist     1  0.001956 0.22776 -1188.1
## + age:gender         1  0.001951 0.22777 -1188.1
## + chol:hdl           1  0.001903 0.22782 -1188.0
## + location:height    1  0.001816 0.22790 -1188.0
## + stab.glu:time.ppn  1  0.001752 0.22797 -1187.9
## + ratio:frame        2  0.004202 0.22552 -1187.9
## + age:time.ppn       1  0.001479 0.22824 -1187.7
## + location:weight    1  0.001458 0.22826 -1187.7
## + hdl:bp.1s          1  0.001450 0.22827 -1187.7
## + hdl:height         1  0.001394 0.22833 -1187.6
## + chol:bp.1d         1  0.001330 0.22839 -1187.6
## - waist              1  0.003764 0.23348 -1187.5
## + location:age       1  0.001204 0.22852 -1187.5
## + age:height         1  0.001173 0.22855 -1187.5
## + height:time.ppn    1  0.001094 0.22863 -1187.4
## + chol:location      1  0.001065 0.22865 -1187.4
## + hdl:hip            1  0.001059 0.22866 -1187.3
## + ratio:location     1  0.001027 0.22869 -1187.3
## + location:hip       1  0.000970 0.22875 -1187.3
## + location:bp.1s     1  0.000911 0.22881 -1187.2
## + ratio:bp.1s        1  0.000859 0.22886 -1187.2
## + stab.glu:bp.1d     1  0.000833 0.22889 -1187.2
## + chol:age           1  0.000810 0.22891 -1187.2
## + ratio:time.ppn     1  0.000794 0.22893 -1187.1
## + hdl:waist          1  0.000792 0.22893 -1187.1
## + location:time.ppn  1  0.000754 0.22897 -1187.1
## + age:hip            1  0.000753 0.22897 -1187.1
## + stab.glu:bp.1s     1  0.000720 0.22900 -1187.1
## + frame:time.ppn     2  0.003188 0.22653 -1187.1
## + chol:weight        1  0.000688 0.22903 -1187.1
## + ratio:height       1  0.000682 0.22904 -1187.0
## + gender:weight      1  0.000622 0.22910 -1187.0
## + ratio:age          1  0.000594 0.22913 -1187.0
## + hdl:time.ppn       1  0.000468 0.22925 -1186.9
## + frame:bp.1d        2  0.002950 0.22677 -1186.9
## + height:bp.1d       1  0.000396 0.22932 -1186.8
## + gender:bp.1s       1  0.000386 0.22933 -1186.8
## + stab.glu:waist     1  0.000357 0.22936 -1186.8
## + chol:waist         1  0.000356 0.22936 -1186.8
## + ratio:weight       1  0.000327 0.22939 -1186.8
## + height:bp.1s       1  0.000306 0.22941 -1186.8
## + ratio:hip          1  0.000306 0.22941 -1186.8
## + bp.1d:waist        1  0.000272 0.22945 -1186.7
## + chol:gender        1  0.000243 0.22948 -1186.7
## + age:bp.1s          1  0.000239 0.22948 -1186.7
## + weight:waist       1  0.000233 0.22949 -1186.7
## + ratio:bp.1d        1  0.000208 0.22951 -1186.7
## + hdl:bp.1d          1  0.000205 0.22952 -1186.7
## + chol:hip           1  0.000194 0.22953 -1186.7
## + gender:hip         1  0.000189 0.22953 -1186.7
## + chol:time.ppn      1  0.000165 0.22955 -1186.6
## + gender:waist       1  0.000162 0.22956 -1186.6
## + height:waist       1  0.000110 0.22961 -1186.6
## + weight:bp.1d       1  0.000104 0.22962 -1186.6
## + height:hip         1  0.000087 0.22963 -1186.6
## + chol:height        1  0.000084 0.22964 -1186.6
## + chol:bp.1s         1  0.000081 0.22964 -1186.6
## + weight:hip         1  0.000077 0.22964 -1186.6
## + bp.1s:bp.1d        1  0.000076 0.22964 -1186.6
## + chol:ratio         1  0.000073 0.22965 -1186.6
## + gender:bp.1d       1  0.000061 0.22966 -1186.6
## + ratio:gender       1  0.000053 0.22967 -1186.5
## + bp.1d:hip          1  0.000046 0.22967 -1186.5
## + stab.glu:weight    1  0.000026 0.22969 -1186.5
## + hdl:location       1  0.000020 0.22970 -1186.5
## + stab.glu:location  1  0.000011 0.22971 -1186.5
## + age:waist          1  0.000002 0.22972 -1186.5
## + age:weight         1  0.000002 0.22972 -1186.5
## + height:weight      1  0.000001 0.22972 -1186.5
## + ratio:waist        1  0.000000 0.22972 -1186.5
## + chol:stab.glu      1  0.000000 0.22972 -1186.5
## + hdl:gender         1  0.000000 0.22972 -1186.5
## + waist:hip          1  0.000000 0.22972 -1186.5
## + gender:frame       2  0.002238 0.22748 -1186.3
## + frame:bp.1s        2  0.001844 0.22788 -1186.0
## + height:frame       2  0.001707 0.22801 -1185.9
## + weight:frame       2  0.001106 0.22861 -1185.4
## + frame:hip          2  0.000433 0.22929 -1184.8
## + frame:waist        2  0.000405 0.22932 -1184.8
## + chol:frame         2  0.000280 0.22944 -1184.7
## + age:frame          2  0.000184 0.22954 -1184.7
## - age                1  0.008615 0.23833 -1183.8
## - stab.glu           1  0.133108 0.36283 -1106.9
## 
## Step:  AIC=-1197.44
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + location + age + 
##     gender + height + weight + frame + bp.1s + bp.1d + waist + 
##     hip + time.ppn + stab.glu:gender
## 
##                     Df Sum of Sq     RSS     AIC
## + hdl:ratio          1 0.0084204 0.20798 -1202.7
## + location:bp.1d     1 0.0083865 0.20802 -1202.7
## + hip:time.ppn       1 0.0056884 0.21072 -1200.3
## + age:bp.1d          1 0.0053089 0.21110 -1200.0
## + age:gender         1 0.0050948 0.21131 -1199.8
## + location:frame     2 0.0070692 0.20933 -1199.5
## - bp.1d              1 0.0000083 0.21641 -1199.4
## - frame              2 0.0024033 0.21881 -1199.4
## - ratio              1 0.0001054 0.21651 -1199.3
## - hdl                1 0.0001389 0.21654 -1199.3
## - location           1 0.0001432 0.21655 -1199.3
## - chol               1 0.0002597 0.21666 -1199.2
## - bp.1s              1 0.0003308 0.21674 -1199.2
## - hip                1 0.0007172 0.21712 -1198.8
## - height             1 0.0008783 0.21728 -1198.7
## + weight:bp.1s       1 0.0034400 0.21296 -1198.4
## + hdl:age            1 0.0033767 0.21303 -1198.3
## - weight             1 0.0014080 0.21781 -1198.2
## + bp.1s:waist        1 0.0032436 0.21316 -1198.2
## + gender:time.ppn    1 0.0031187 0.21329 -1198.1
## + age:height         1 0.0028808 0.21352 -1197.9
## + gender:height      1 0.0025305 0.21387 -1197.6
## + ratio:frame        2 0.0048365 0.21157 -1197.6
## + bp.1s:hip          1 0.0024857 0.21392 -1197.5
## <none>                           0.21640 -1197.4
## + location:height    1 0.0022756 0.21413 -1197.4
## + waist:time.ppn     1 0.0021925 0.21421 -1197.3
## + weight:time.ppn    1 0.0021723 0.21423 -1197.3
## + location:gender    1 0.0021035 0.21430 -1197.2
## + hdl:frame          2 0.0043094 0.21210 -1197.1
## + location:age       1 0.0019565 0.21445 -1197.1
## + bp.1d:time.ppn     1 0.0018977 0.21451 -1197.0
## + stab.glu:time.ppn  1 0.0017554 0.21465 -1196.9
## + ratio:gender       1 0.0016731 0.21473 -1196.9
## + frame:time.ppn     2 0.0039906 0.21241 -1196.8
## + location:waist     1 0.0016390 0.21477 -1196.8
## - time.ppn           1 0.0031476 0.21955 -1196.8
## + chol:hdl           1 0.0015883 0.21482 -1196.8
## + hdl:weight         1 0.0014570 0.21495 -1196.7
## + location:weight    1 0.0013063 0.21510 -1196.5
## + ratio:time.ppn     1 0.0012832 0.21512 -1196.5
## + frame:bp.1d        2 0.0035188 0.21288 -1196.4
## + chol:bp.1d         1 0.0011740 0.21523 -1196.4
## + hdl:time.ppn       1 0.0010625 0.21534 -1196.3
## + ratio:age          1 0.0010118 0.21539 -1196.3
## + hdl:bp.1s          1 0.0010038 0.21540 -1196.3
## + hdl:hip            1 0.0009764 0.21543 -1196.3
## + height:time.ppn    1 0.0009411 0.21546 -1196.2
## + hdl:height         1 0.0009014 0.21550 -1196.2
## + stab.glu:age       1 0.0008895 0.21552 -1196.2
## + bp.1s:time.ppn     1 0.0008695 0.21554 -1196.2
## + stab.glu:location  1 0.0008547 0.21555 -1196.2
## + age:hip            1 0.0008399 0.21556 -1196.2
## + location:hip       1 0.0008108 0.21559 -1196.1
## + stab.glu:weight    1 0.0007752 0.21563 -1196.1
## + location:time.ppn  1 0.0007389 0.21566 -1196.1
## + hdl:gender         1 0.0006902 0.21571 -1196.0
## + stab.glu:hip       1 0.0006334 0.21577 -1196.0
## + ratio:hip          1 0.0005565 0.21585 -1195.9
## + chol:ratio         1 0.0005389 0.21587 -1195.9
## + stab.glu:waist     1 0.0005335 0.21587 -1195.9
## + chol:location      1 0.0005200 0.21588 -1195.9
## + age:time.ppn       1 0.0005033 0.21590 -1195.9
## + chol:age           1 0.0004955 0.21591 -1195.9
## + stab.glu:ratio     1 0.0004899 0.21591 -1195.8
## + stab.glu:bp.1s     1 0.0004772 0.21593 -1195.8
## + chol:weight        1 0.0004702 0.21593 -1195.8
## + ratio:location     1 0.0004632 0.21594 -1195.8
## + hdl:bp.1d          1 0.0004492 0.21596 -1195.8
## + age:bp.1s          1 0.0004413 0.21596 -1195.8
## + ratio:bp.1s        1 0.0004335 0.21597 -1195.8
## - waist              1 0.0043495 0.22075 -1195.8
## + frame:bp.1s        2 0.0027402 0.21366 -1195.8
## + weight:hip         1 0.0003061 0.21610 -1195.7
## + location:bp.1s     1 0.0002419 0.21616 -1195.6
## + weight:bp.1d       1 0.0002228 0.21618 -1195.6
## + bp.1d:waist        1 0.0002224 0.21618 -1195.6
## + stab.glu:bp.1d     1 0.0002046 0.21620 -1195.6
## + ratio:waist        1 0.0001805 0.21622 -1195.6
## + bp.1s:bp.1d        1 0.0001805 0.21622 -1195.6
## + gender:waist       1 0.0001645 0.21624 -1195.6
## + ratio:height       1 0.0001235 0.21628 -1195.5
## + stab.glu:height    1 0.0001111 0.21629 -1195.5
## + height:weight      1 0.0001101 0.21629 -1195.5
## + chol:waist         1 0.0001098 0.21629 -1195.5
## + hdl:waist          1 0.0000996 0.21630 -1195.5
## + gender:hip         1 0.0000894 0.21632 -1195.5
## + chol:bp.1s         1 0.0000564 0.21635 -1195.5
## + gender:bp.1s       1 0.0000555 0.21635 -1195.5
## + age:weight         1 0.0000479 0.21636 -1195.5
## + height:bp.1d       1 0.0000467 0.21636 -1195.5
## + gender:bp.1d       1 0.0000457 0.21636 -1195.5
## + height:waist       1 0.0000441 0.21636 -1195.5
## + ratio:bp.1d        1 0.0000431 0.21636 -1195.5
## + gender:weight      1 0.0000428 0.21636 -1195.5
## + ratio:weight       1 0.0000285 0.21638 -1195.5
## + age:waist          1 0.0000267 0.21638 -1195.5
## + height:bp.1s       1 0.0000202 0.21638 -1195.5
## + waist:hip          1 0.0000118 0.21639 -1195.5
## + height:hip         1 0.0000089 0.21640 -1195.4
## + chol:gender        1 0.0000080 0.21640 -1195.4
## + chol:time.ppn      1 0.0000062 0.21640 -1195.4
## + weight:waist       1 0.0000060 0.21640 -1195.4
## + stab.glu:hdl       1 0.0000048 0.21640 -1195.4
## + bp.1d:hip          1 0.0000039 0.21640 -1195.4
## + hdl:location       1 0.0000016 0.21640 -1195.4
## + chol:stab.glu      1 0.0000015 0.21640 -1195.4
## + chol:height        1 0.0000002 0.21640 -1195.4
## + chol:hip           1 0.0000001 0.21640 -1195.4
## + stab.glu:frame     2 0.0011029 0.21530 -1194.4
## + height:frame       2 0.0007562 0.21565 -1194.1
## + gender:frame       2 0.0007060 0.21570 -1194.0
## + age:frame          2 0.0005657 0.21584 -1193.9
## + weight:frame       2 0.0002565 0.21615 -1193.7
## + chol:frame         2 0.0001016 0.21630 -1193.5
## + frame:waist        2 0.0000261 0.21638 -1193.5
## + frame:hip          2 0.0000228 0.21638 -1193.5
## - age                1 0.0075980 0.22400 -1193.1
## - stab.glu:gender    1 0.0133158 0.22972 -1188.5
## 
## Step:  AIC=-1202.7
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + location + age + 
##     gender + height + weight + frame + bp.1s + bp.1d + waist + 
##     hip + time.ppn + stab.glu:gender + hdl:ratio
## 
##                     Df Sum of Sq     RSS     AIC
## + age:bp.1d          1 0.0066240 0.20136 -1206.6
## + location:bp.1d     1 0.0062980 0.20169 -1206.3
## + hip:time.ppn       1 0.0061325 0.20185 -1206.2
## + age:gender         1 0.0052330 0.20275 -1205.4
## - frame              2 0.0021759 0.21016 -1204.8
## - location           1 0.0000177 0.20800 -1204.7
## - bp.1d              1 0.0000425 0.20803 -1204.7
## - bp.1s              1 0.0001242 0.20811 -1204.6
## + bp.1s:waist        1 0.0037788 0.20420 -1204.1
## + location:frame     2 0.0059823 0.20200 -1204.0
## - hip                1 0.0007903 0.20877 -1204.0
## - height             1 0.0008339 0.20882 -1204.0
## + weight:bp.1s       1 0.0034543 0.20453 -1203.8
## + gender:time.ppn    1 0.0032724 0.20471 -1203.6
## + age:height         1 0.0032026 0.20478 -1203.5
## + bp.1s:hip          1 0.0027055 0.20528 -1203.1
## - weight             1 0.0018973 0.20988 -1203.0
## + gender:height      1 0.0024738 0.20551 -1202.9
## + weight:time.ppn    1 0.0024018 0.20558 -1202.8
## + location:height    1 0.0023548 0.20563 -1202.8
## <none>                           0.20798 -1202.7
## + waist:time.ppn     1 0.0022571 0.20573 -1202.7
## + stab.glu:time.ppn  1 0.0021778 0.20581 -1202.6
## + location:age       1 0.0019126 0.20607 -1202.4
## + hdl:age            1 0.0018868 0.20610 -1202.4
## + hdl:weight         1 0.0018345 0.20615 -1202.3
## + location:gender    1 0.0017888 0.20619 -1202.3
## - time.ppn           1 0.0028082 0.21079 -1202.2
## + chol:bp.1d         1 0.0014464 0.20654 -1202.0
## + bp.1d:time.ppn     1 0.0014099 0.20657 -1201.9
## + hdl:hip            1 0.0013941 0.20659 -1201.9
## + hdl:time.ppn       1 0.0013905 0.20659 -1201.9
## + ratio:time.ppn     1 0.0013862 0.20660 -1201.9
## + ratio:gender       1 0.0012507 0.20673 -1201.8
## + stab.glu:age       1 0.0012051 0.20678 -1201.8
## + age:hip            1 0.0011783 0.20680 -1201.7
## + height:time.ppn    1 0.0011755 0.20681 -1201.7
## + location:waist     1 0.0011440 0.20684 -1201.7
## + frame:time.ppn     2 0.0033494 0.20463 -1201.7
## + bp.1s:time.ppn     1 0.0010938 0.20689 -1201.7
## + location:weight    1 0.0010671 0.20692 -1201.6
## + ratio:frame        2 0.0033055 0.20468 -1201.6
## + stab.glu:location  1 0.0010529 0.20693 -1201.6
## + location:time.ppn  1 0.0008703 0.20711 -1201.5
## + chol:hdl           1 0.0008679 0.20712 -1201.5
## + hdl:gender         1 0.0008666 0.20712 -1201.5
## + ratio:age          1 0.0008625 0.20712 -1201.5
## + age:bp.1s          1 0.0007421 0.20724 -1201.3
## + stab.glu:weight    1 0.0007413 0.20724 -1201.3
## + ratio:hip          1 0.0007105 0.20727 -1201.3
## + frame:bp.1s        2 0.0029112 0.20507 -1201.3
## + stab.glu:hip       1 0.0006086 0.20738 -1201.2
## + location:hip       1 0.0006083 0.20738 -1201.2
## + hdl:bp.1s          1 0.0005989 0.20739 -1201.2
## + stab.glu:bp.1s     1 0.0005938 0.20739 -1201.2
## + age:time.ppn       1 0.0005571 0.20743 -1201.2
## + stab.glu:ratio     1 0.0005483 0.20744 -1201.2
## + chol:ratio         1 0.0005356 0.20745 -1201.2
## + stab.glu:waist     1 0.0005037 0.20748 -1201.1
## + ratio:bp.1s        1 0.0004607 0.20752 -1201.1
## + hdl:waist          1 0.0003910 0.20759 -1201.0
## + chol:weight        1 0.0003648 0.20762 -1201.0
## + hdl:height         1 0.0003579 0.20763 -1201.0
## + hdl:bp.1d          1 0.0003567 0.20763 -1201.0
## + chol:location      1 0.0003490 0.20763 -1201.0
## + weight:hip         1 0.0003283 0.20766 -1201.0
## + weight:bp.1d       1 0.0002943 0.20769 -1201.0
## + height:weight      1 0.0002921 0.20769 -1201.0
## + bp.1d:waist        1 0.0002852 0.20770 -1201.0
## + stab.glu:bp.1d     1 0.0002552 0.20773 -1200.9
## + height:bp.1d       1 0.0002389 0.20775 -1200.9
## + location:bp.1s     1 0.0002076 0.20778 -1200.9
## + frame:bp.1d        2 0.0024593 0.20552 -1200.9
## + ratio:weight       1 0.0001892 0.20780 -1200.9
## + hdl:frame          2 0.0024465 0.20554 -1200.9
## + ratio:location     1 0.0001751 0.20781 -1200.8
## + height:waist       1 0.0001517 0.20783 -1200.8
## + ratio:height       1 0.0001510 0.20783 -1200.8
## + chol:age           1 0.0001486 0.20783 -1200.8
## + gender:weight      1 0.0001453 0.20784 -1200.8
## + chol:bp.1s         1 0.0001352 0.20785 -1200.8
## + chol:waist         1 0.0001078 0.20788 -1200.8
## + gender:bp.1d       1 0.0000677 0.20792 -1200.8
## + stab.glu:hdl       1 0.0000667 0.20792 -1200.8
## + height:hip         1 0.0000629 0.20792 -1200.8
## + chol:gender        1 0.0000579 0.20793 -1200.8
## + stab.glu:height    1 0.0000574 0.20793 -1200.8
## + gender:waist       1 0.0000560 0.20793 -1200.8
## + height:bp.1s       1 0.0000513 0.20793 -1200.8
## + chol:height        1 0.0000276 0.20796 -1200.7
## + gender:hip         1 0.0000227 0.20796 -1200.7
## + bp.1s:bp.1d        1 0.0000174 0.20797 -1200.7
## + gender:bp.1s       1 0.0000130 0.20797 -1200.7
## + ratio:bp.1d        1 0.0000118 0.20797 -1200.7
## + hdl:location       1 0.0000113 0.20797 -1200.7
## + chol:stab.glu      1 0.0000074 0.20798 -1200.7
## + waist:hip          1 0.0000067 0.20798 -1200.7
## + ratio:waist        1 0.0000049 0.20798 -1200.7
## + chol:time.ppn      1 0.0000045 0.20798 -1200.7
## + chol:hip           1 0.0000023 0.20798 -1200.7
## + bp.1d:hip          1 0.0000023 0.20798 -1200.7
## + weight:waist       1 0.0000010 0.20798 -1200.7
## + age:weight         1 0.0000008 0.20798 -1200.7
## + age:waist          1 0.0000004 0.20798 -1200.7
## + stab.glu:frame     2 0.0015619 0.20642 -1200.1
## - waist              1 0.0053425 0.21333 -1200.1
## + age:frame          2 0.0007778 0.20721 -1199.4
## + height:frame       2 0.0006426 0.20734 -1199.3
## + gender:frame       2 0.0006247 0.20736 -1199.2
## + weight:frame       2 0.0004987 0.20749 -1199.1
## + frame:hip          2 0.0001227 0.20786 -1198.8
## + chol:frame         2 0.0001021 0.20788 -1198.8
## + frame:waist        2 0.0000890 0.20789 -1198.8
## - age                1 0.0072683 0.21525 -1198.4
## - hdl:ratio          1 0.0084204 0.21640 -1197.4
## - chol               1 0.0086658 0.21665 -1197.2
## - stab.glu:gender    1 0.0126700 0.22065 -1193.9
## 
## Step:  AIC=-1206.62
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + location + age + 
##     gender + height + weight + frame + bp.1s + bp.1d + waist + 
##     hip + time.ppn + stab.glu:gender + hdl:ratio + age:bp.1d
## 
##                     Df Sum of Sq     RSS     AIC
## + age:gender         1 0.0050627 0.19630 -1209.3
## - frame              2 0.0015250 0.20289 -1209.2
## + weight:bp.1s       1 0.0046776 0.19668 -1208.9
## - bp.1s              1 0.0000112 0.20137 -1208.6
## - location           1 0.0001073 0.20147 -1208.5
## + location:bp.1d     1 0.0042469 0.19711 -1208.5
## + age:height         1 0.0041765 0.19718 -1208.5
## + hip:time.ppn       1 0.0040505 0.19731 -1208.3
## - hip                1 0.0005672 0.20193 -1208.1
## + age:hip            1 0.0034850 0.19787 -1207.8
## - weight             1 0.0009935 0.20235 -1207.7
## + bp.1s:waist        1 0.0032217 0.19814 -1207.6
## + bp.1s:hip          1 0.0031591 0.19820 -1207.5
## - height             1 0.0012873 0.20265 -1207.5
## + hdl:weight         1 0.0029073 0.19845 -1207.3
## + gender:time.ppn    1 0.0026730 0.19869 -1207.1
## + location:frame     2 0.0048034 0.19656 -1207.0
## + location:height    1 0.0024923 0.19887 -1206.9
## + stab.glu:time.ppn  1 0.0024755 0.19888 -1206.9
## + gender:height      1 0.0024186 0.19894 -1206.8
## + hdl:age            1 0.0024177 0.19894 -1206.8
## <none>                           0.20136 -1206.6
## + hdl:hip            1 0.0020610 0.19930 -1206.5
## + hdl:time.ppn       1 0.0019768 0.19938 -1206.4
## - time.ppn           1 0.0024991 0.20386 -1206.4
## + ratio:time.ppn     1 0.0018381 0.19952 -1206.3
## + stab.glu:age       1 0.0018082 0.19955 -1206.3
## + height:time.ppn    1 0.0014762 0.19988 -1206.0
## + location:waist     1 0.0013968 0.19996 -1205.9
## + bp.1s:time.ppn     1 0.0013962 0.19996 -1205.9
## + ratio:gender       1 0.0013519 0.20001 -1205.9
## + stab.glu:location  1 0.0013423 0.20002 -1205.8
## + chol:hdl           1 0.0013342 0.20003 -1205.8
## + weight:bp.1d       1 0.0012644 0.20009 -1205.8
## + stab.glu:bp.1s     1 0.0012189 0.20014 -1205.7
## + ratio:hip          1 0.0012133 0.20015 -1205.7
## + location:gender    1 0.0011564 0.20020 -1205.7
## + waist:time.ppn     1 0.0011211 0.20024 -1205.6
## + weight:time.ppn    1 0.0010782 0.20028 -1205.6
## + hdl:gender         1 0.0009595 0.20040 -1205.5
## + frame:time.ppn     2 0.0031340 0.19823 -1205.5
## + chol:age           1 0.0009468 0.20041 -1205.5
## + stab.glu:ratio     1 0.0009426 0.20042 -1205.5
## + hdl:bp.1s          1 0.0009117 0.20045 -1205.5
## + weight:hip         1 0.0009048 0.20045 -1205.5
## + age:time.ppn       1 0.0008694 0.20049 -1205.4
## + location:weight    1 0.0008329 0.20053 -1205.4
## + location:time.ppn  1 0.0007592 0.20060 -1205.3
## + location:age       1 0.0007570 0.20060 -1205.3
## + hdl:waist          1 0.0007361 0.20062 -1205.3
## + chol:weight        1 0.0007314 0.20063 -1205.3
## + height:weight      1 0.0006704 0.20069 -1205.2
## + bp.1d:time.ppn     1 0.0006533 0.20071 -1205.2
## + ratio:age          1 0.0006308 0.20073 -1205.2
## + location:hip       1 0.0006115 0.20075 -1205.2
## + chol:ratio         1 0.0005290 0.20083 -1205.1
## + age:weight         1 0.0005122 0.20085 -1205.1
## + stab.glu:hip       1 0.0004823 0.20088 -1205.1
## + height:waist       1 0.0004816 0.20088 -1205.1
## + ratio:weight       1 0.0004675 0.20089 -1205.0
## + age:bp.1s          1 0.0004625 0.20090 -1205.0
## + stab.glu:weight    1 0.0004112 0.20095 -1205.0
## + chol:location      1 0.0003967 0.20096 -1205.0
## + gender:waist       1 0.0003831 0.20098 -1205.0
## + hdl:height         1 0.0003819 0.20098 -1205.0
## + bp.1s:bp.1d        1 0.0003741 0.20099 -1205.0
## + age:waist          1 0.0003479 0.20101 -1204.9
## + bp.1d:hip          1 0.0003426 0.20102 -1204.9
## + bp.1d:waist        1 0.0002820 0.20108 -1204.9
## + height:hip         1 0.0002668 0.20109 -1204.9
## + gender:hip         1 0.0002465 0.20111 -1204.8
## + location:bp.1s     1 0.0002354 0.20112 -1204.8
## + hdl:bp.1d          1 0.0002337 0.20113 -1204.8
## + stab.glu:waist     1 0.0002243 0.20114 -1204.8
## + chol:bp.1d         1 0.0002163 0.20114 -1204.8
## + ratio:bp.1d        1 0.0001800 0.20118 -1204.8
## + frame:bp.1s        2 0.0023636 0.19900 -1204.8
## + stab.glu:height    1 0.0001762 0.20118 -1204.8
## + chol:bp.1s         1 0.0001625 0.20120 -1204.8
## + height:bp.1s       1 0.0001430 0.20122 -1204.8
## + chol:waist         1 0.0000890 0.20127 -1204.7
## + ratio:bp.1s        1 0.0000854 0.20127 -1204.7
## + stab.glu:hdl       1 0.0000723 0.20129 -1204.7
## + chol:height        1 0.0000585 0.20130 -1204.7
## + hdl:location       1 0.0000561 0.20130 -1204.7
## + gender:bp.1s       1 0.0000474 0.20131 -1204.7
## + weight:waist       1 0.0000453 0.20131 -1204.7
## + chol:gender        1 0.0000446 0.20131 -1204.7
## + waist:hip          1 0.0000439 0.20132 -1204.7
## + ratio:waist        1 0.0000378 0.20132 -1204.7
## + ratio:location     1 0.0000371 0.20132 -1204.7
## + ratio:height       1 0.0000318 0.20133 -1204.7
## + chol:stab.glu      1 0.0000145 0.20134 -1204.6
## + gender:weight      1 0.0000128 0.20135 -1204.6
## + chol:time.ppn      1 0.0000065 0.20135 -1204.6
## + chol:hip           1 0.0000035 0.20136 -1204.6
## + gender:bp.1d       1 0.0000033 0.20136 -1204.6
## + stab.glu:bp.1d     1 0.0000025 0.20136 -1204.6
## + height:bp.1d       1 0.0000001 0.20136 -1204.6
## + hdl:frame          2 0.0020676 0.19929 -1204.5
## + ratio:frame        2 0.0020285 0.19933 -1204.5
## - waist              1 0.0046422 0.20600 -1204.5
## + frame:bp.1d        2 0.0018980 0.19946 -1204.4
## + stab.glu:frame     2 0.0013272 0.20003 -1203.8
## + weight:frame       2 0.0012053 0.20015 -1203.7
## + age:frame          2 0.0007673 0.20059 -1203.3
## + height:frame       2 0.0006494 0.20071 -1203.2
## + frame:hip          2 0.0005575 0.20080 -1203.1
## + frame:waist        2 0.0004982 0.20086 -1203.1
## + gender:frame       2 0.0002615 0.20110 -1202.9
## - age:bp.1d          1 0.0066240 0.20798 -1202.7
## + chol:frame         2 0.0000468 0.20131 -1202.7
## - chol               1 0.0096728 0.21103 -1200.0
## - hdl:ratio          1 0.0097356 0.21110 -1200.0
## - stab.glu:gender    1 0.0116206 0.21298 -1198.4
## 
## Step:  AIC=-1209.28
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + location + age + 
##     gender + height + weight + frame + bp.1s + bp.1d + waist + 
##     hip + time.ppn + stab.glu:gender + hdl:ratio + age:bp.1d + 
##     age:gender
## 
##                     Df Sum of Sq     RSS     AIC
## + weight:bp.1s       1 0.0047056 0.19159 -1211.7
## + bp.1s:waist        1 0.0046597 0.19164 -1211.7
## + gender:height      1 0.0045363 0.19176 -1211.6
## + bp.1s:hip          1 0.0044571 0.19184 -1211.5
## - frame              2 0.0022196 0.19852 -1211.2
## - location           1 0.0002131 0.19651 -1211.1
## - bp.1s              1 0.0002720 0.19657 -1211.0
## + hip:time.ppn       1 0.0038394 0.19246 -1210.9
## - hip                1 0.0006108 0.19691 -1210.7
## + location:bp.1d     1 0.0036200 0.19268 -1210.7
## - weight             1 0.0009175 0.19721 -1210.4
## + hdl:weight         1 0.0033151 0.19298 -1210.4
## + location:frame     2 0.0050082 0.19129 -1210.0
## + hdl:time.ppn       1 0.0026371 0.19366 -1209.8
## + stab.glu:time.ppn  1 0.0025228 0.19377 -1209.7
## + hdl:hip            1 0.0022782 0.19402 -1209.4
## + location:height    1 0.0022705 0.19403 -1209.4
## + weight:bp.1d       1 0.0022289 0.19407 -1209.4
## - height             1 0.0020852 0.19838 -1209.3
## <none>                           0.19630 -1209.3
## + gender:time.ppn    1 0.0020907 0.19421 -1209.2
## + ratio:time.ppn     1 0.0017824 0.19451 -1209.0
## + bp.1s:time.ppn     1 0.0017522 0.19454 -1208.9
## + location:waist     1 0.0016458 0.19465 -1208.8
## + stab.glu:age       1 0.0016431 0.19465 -1208.8
## + hdl:age            1 0.0015928 0.19470 -1208.8
## + stab.glu:location  1 0.0013369 0.19496 -1208.5
## + age:hip            1 0.0013223 0.19498 -1208.5
## + stab.glu:ratio     1 0.0013096 0.19499 -1208.5
## + hdl:waist          1 0.0011391 0.19516 -1208.3
## + stab.glu:bp.1s     1 0.0011130 0.19518 -1208.3
## + chol:hdl           1 0.0010450 0.19525 -1208.3
## + height:time.ppn    1 0.0010367 0.19526 -1208.2
## + location:weight    1 0.0010043 0.19529 -1208.2
## + waist:time.ppn     1 0.0009778 0.19532 -1208.2
## + weight:time.ppn    1 0.0009738 0.19532 -1208.2
## + height:weight      1 0.0009290 0.19537 -1208.2
## + bp.1d:waist        1 0.0009102 0.19539 -1208.1
## + chol:weight        1 0.0008911 0.19541 -1208.1
## + location:gender    1 0.0008698 0.19543 -1208.1
## + ratio:hip          1 0.0008689 0.19543 -1208.1
## + gender:bp.1s       1 0.0008373 0.19546 -1208.1
## + weight:hip         1 0.0008208 0.19548 -1208.0
## + bp.1s:bp.1d        1 0.0008178 0.19548 -1208.0
## + age:time.ppn       1 0.0007660 0.19553 -1208.0
## + location:hip       1 0.0007497 0.19555 -1208.0
## + chol:age           1 0.0007273 0.19557 -1208.0
## + hdl:bp.1s          1 0.0007141 0.19558 -1208.0
## + bp.1d:hip          1 0.0007093 0.19559 -1208.0
## + hdl:gender         1 0.0007070 0.19559 -1207.9
## + chol:location      1 0.0006917 0.19561 -1207.9
## + bp.1d:time.ppn     1 0.0006830 0.19561 -1207.9
## + location:age       1 0.0006828 0.19561 -1207.9
## + age:weight         1 0.0006278 0.19567 -1207.9
## + ratio:gender       1 0.0005832 0.19571 -1207.8
## + frame:time.ppn     2 0.0027030 0.19359 -1207.8
## + age:height         1 0.0005156 0.19578 -1207.8
## - time.ppn           1 0.0038582 0.20015 -1207.7
## + ratio:weight       1 0.0004570 0.19584 -1207.7
## + chol:ratio         1 0.0004241 0.19587 -1207.7
## + chol:gender        1 0.0004140 0.19588 -1207.7
## + location:time.ppn  1 0.0004082 0.19589 -1207.7
## + hdl:height         1 0.0003903 0.19591 -1207.7
## + stab.glu:hip       1 0.0003807 0.19592 -1207.6
## + stab.glu:height    1 0.0003751 0.19592 -1207.6
## + stab.glu:weight    1 0.0003749 0.19592 -1207.6
## + frame:bp.1s        2 0.0024294 0.19387 -1207.6
## + ratio:age          1 0.0002576 0.19604 -1207.5
## + gender:hip         1 0.0002366 0.19606 -1207.5
## + stab.glu:waist     1 0.0002299 0.19607 -1207.5
## + chol:waist         1 0.0002185 0.19608 -1207.5
## + chol:stab.glu      1 0.0002074 0.19609 -1207.5
## + hdl:location       1 0.0001765 0.19612 -1207.5
## + location:bp.1s     1 0.0001581 0.19614 -1207.4
## + chol:hip           1 0.0001578 0.19614 -1207.4
## + chol:bp.1s         1 0.0001575 0.19614 -1207.4
## + age:waist          1 0.0001471 0.19615 -1207.4
## + hdl:frame          2 0.0022789 0.19402 -1207.4
## + ratio:height       1 0.0001435 0.19615 -1207.4
## + chol:bp.1d         1 0.0001333 0.19616 -1207.4
## + chol:time.ppn      1 0.0001092 0.19619 -1207.4
## + weight:waist       1 0.0000877 0.19621 -1207.4
## + waist:hip          1 0.0000808 0.19622 -1207.4
## + height:hip         1 0.0000753 0.19622 -1207.3
## + height:waist       1 0.0000707 0.19623 -1207.3
## + ratio:waist        1 0.0000598 0.19624 -1207.3
## + ratio:bp.1d        1 0.0000451 0.19625 -1207.3
## + hdl:bp.1d          1 0.0000350 0.19626 -1207.3
## + ratio:bp.1s        1 0.0000316 0.19626 -1207.3
## + ratio:location     1 0.0000315 0.19627 -1207.3
## + gender:waist       1 0.0000259 0.19627 -1207.3
## + gender:weight      1 0.0000171 0.19628 -1207.3
## + age:bp.1s          1 0.0000159 0.19628 -1207.3
## + stab.glu:hdl       1 0.0000150 0.19628 -1207.3
## + stab.glu:bp.1d     1 0.0000072 0.19629 -1207.3
## + height:bp.1s       1 0.0000069 0.19629 -1207.3
## + gender:bp.1d       1 0.0000006 0.19630 -1207.3
## + chol:height        1 0.0000002 0.19630 -1207.3
## + height:bp.1d       1 0.0000001 0.19630 -1207.3
## - waist              1 0.0043434 0.20064 -1207.3
## + height:frame       2 0.0019412 0.19436 -1207.1
## + ratio:frame        2 0.0018534 0.19444 -1207.0
## + frame:bp.1d        2 0.0015534 0.19474 -1206.7
## - age:gender         1 0.0050627 0.20136 -1206.6
## + gender:frame       2 0.0013478 0.19495 -1206.5
## + weight:frame       2 0.0012716 0.19503 -1206.5
## + stab.glu:frame     2 0.0008532 0.19544 -1206.1
## + frame:waist        2 0.0003402 0.19596 -1205.6
## + frame:hip          2 0.0002473 0.19605 -1205.5
## + age:frame          2 0.0002311 0.19607 -1205.5
## - age:bp.1d          1 0.0064538 0.20275 -1205.4
## + chol:frame         2 0.0000740 0.19622 -1205.3
## - hdl:ratio          1 0.0098628 0.20616 -1202.3
## - chol               1 0.0102327 0.20653 -1202.0
## - stab.glu:gender    1 0.0146028 0.21090 -1198.2
## 
## Step:  AIC=-1211.72
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + location + age + 
##     gender + height + weight + frame + bp.1s + bp.1d + waist + 
##     hip + time.ppn + stab.glu:gender + hdl:ratio + age:bp.1d + 
##     age:gender + weight:bp.1s
## 
##                     Df Sum of Sq     RSS     AIC
## - frame              2 0.0020849 0.19368 -1213.7
## - location           1 0.0002786 0.19187 -1213.5
## + hip:time.ppn       1 0.0038096 0.18778 -1213.4
## + gender:height      1 0.0037170 0.18787 -1213.3
## + age:hip            1 0.0035476 0.18804 -1213.1
## + location:frame     2 0.0051857 0.18641 -1212.7
## + location:bp.1d     1 0.0030358 0.18856 -1212.7
## - hip                1 0.0014213 0.19301 -1212.4
## - height             1 0.0015686 0.19316 -1212.2
## + age:weight         1 0.0025318 0.18906 -1212.2
## + location:height    1 0.0024565 0.18913 -1212.1
## + stab.glu:bp.1s     1 0.0023690 0.18922 -1212.0
## + location:waist     1 0.0023442 0.18925 -1212.0
## + stab.glu:age       1 0.0023296 0.18926 -1212.0
## + stab.glu:time.ppn  1 0.0022933 0.18930 -1211.9
## + hdl:time.ppn       1 0.0021146 0.18948 -1211.8
## <none>                           0.19159 -1211.7
## + gender:time.ppn    1 0.0019502 0.18964 -1211.6
## + stab.glu:location  1 0.0018356 0.18976 -1211.5
## + stab.glu:ratio     1 0.0017582 0.18983 -1211.4
## + hdl:weight         1 0.0017345 0.18986 -1211.4
## + bp.1s:time.ppn     1 0.0015392 0.19005 -1211.2
## + location:weight    1 0.0015291 0.19006 -1211.2
## + hdl:hip            1 0.0014288 0.19016 -1211.1
## + age:waist          1 0.0013683 0.19022 -1211.0
## + ratio:time.ppn     1 0.0012763 0.19032 -1211.0
## + waist:time.ppn     1 0.0012158 0.19038 -1210.9
## + weight:time.ppn    1 0.0011676 0.19042 -1210.8
## + frame:time.ppn     2 0.0032273 0.18836 -1210.8
## - waist              1 0.0030536 0.19465 -1210.8
## + location:gender    1 0.0010970 0.19049 -1210.8
## + location:hip       1 0.0010774 0.19051 -1210.8
## + age:time.ppn       1 0.0010492 0.19054 -1210.7
## + height:time.ppn    1 0.0007966 0.19079 -1210.5
## + height:weight      1 0.0007839 0.19081 -1210.5
## + hdl:gender         1 0.0007352 0.19086 -1210.4
## + chol:age           1 0.0007284 0.19086 -1210.4
## + hdl:age            1 0.0006410 0.19095 -1210.3
## + gender:bp.1s       1 0.0006363 0.19096 -1210.3
## + chol:location      1 0.0006265 0.19096 -1210.3
## + location:age       1 0.0005314 0.19106 -1210.2
## + height:bp.1s       1 0.0005291 0.19106 -1210.2
## + chol:weight        1 0.0005008 0.19109 -1210.2
## + bp.1s:bp.1d        1 0.0004902 0.19110 -1210.2
## + ratio:hip          1 0.0004822 0.19111 -1210.2
## + ratio:gender       1 0.0004491 0.19114 -1210.2
## + bp.1s:waist        1 0.0004410 0.19115 -1210.2
## + location:time.ppn  1 0.0004363 0.19115 -1210.1
## + ratio:bp.1d        1 0.0004030 0.19119 -1210.1
## + ratio:bp.1s        1 0.0004013 0.19119 -1210.1
## + chol:gender        1 0.0003885 0.19120 -1210.1
## + weight:hip         1 0.0003826 0.19121 -1210.1
## - time.ppn           1 0.0038485 0.19544 -1210.1
## + hdl:bp.1d          1 0.0003677 0.19122 -1210.1
## + stab.glu:height    1 0.0003618 0.19123 -1210.1
## + bp.1s:hip          1 0.0003593 0.19123 -1210.1
## + chol:stab.glu      1 0.0003576 0.19123 -1210.1
## + hdl:waist          1 0.0003384 0.19125 -1210.0
## + chol:hdl           1 0.0003209 0.19127 -1210.0
## + bp.1d:time.ppn     1 0.0002922 0.19130 -1210.0
## + gender:hip         1 0.0002682 0.19132 -1210.0
## + stab.glu:bp.1d     1 0.0002501 0.19134 -1210.0
## + chol:ratio         1 0.0002263 0.19137 -1209.9
## + ratio:weight       1 0.0002032 0.19139 -1209.9
## + bp.1d:hip          1 0.0002010 0.19139 -1209.9
## + age:height         1 0.0001725 0.19142 -1209.9
## + chol:time.ppn      1 0.0001723 0.19142 -1209.9
## + hdl:height         1 0.0001583 0.19143 -1209.9
## + chol:bp.1s         1 0.0001399 0.19145 -1209.9
## + chol:hip           1 0.0001298 0.19146 -1209.8
## + bp.1d:waist        1 0.0001165 0.19148 -1209.8
## + ratio:location     1 0.0001123 0.19148 -1209.8
## + chol:bp.1d         1 0.0000963 0.19149 -1209.8
## + stab.glu:weight    1 0.0000927 0.19150 -1209.8
## + location:bp.1s     1 0.0000881 0.19150 -1209.8
## + height:waist       1 0.0000850 0.19151 -1209.8
## + height:bp.1d       1 0.0000788 0.19151 -1209.8
## + gender:weight      1 0.0000699 0.19152 -1209.8
## + age:bp.1s          1 0.0000650 0.19153 -1209.8
## + gender:waist       1 0.0000615 0.19153 -1209.8
## + ratio:height       1 0.0000614 0.19153 -1209.8
## + height:hip         1 0.0000486 0.19154 -1209.8
## + weight:bp.1d       1 0.0000457 0.19155 -1209.8
## + stab.glu:hip       1 0.0000357 0.19156 -1209.8
## + stab.glu:hdl       1 0.0000345 0.19156 -1209.8
## + chol:waist         1 0.0000337 0.19156 -1209.8
## + stab.glu:waist     1 0.0000185 0.19157 -1209.7
## + ratio:age          1 0.0000133 0.19158 -1209.7
## + hdl:location       1 0.0000115 0.19158 -1209.7
## + weight:waist       1 0.0000097 0.19158 -1209.7
## + gender:bp.1d       1 0.0000073 0.19158 -1209.7
## + hdl:bp.1s          1 0.0000062 0.19159 -1209.7
## + ratio:waist        1 0.0000043 0.19159 -1209.7
## + chol:height        1 0.0000009 0.19159 -1209.7
## + waist:hip          1 0.0000007 0.19159 -1209.7
## + frame:bp.1d        2 0.0019835 0.18961 -1209.6
## + frame:bp.1s        2 0.0018696 0.18972 -1209.5
## + weight:frame       2 0.0017412 0.18985 -1209.4
## + height:frame       2 0.0017071 0.18988 -1209.4
## - weight:bp.1s       1 0.0047056 0.19630 -1209.3
## + gender:frame       2 0.0013958 0.19020 -1209.1
## - age:gender         1 0.0050908 0.19668 -1208.9
## + hdl:frame          2 0.0011275 0.19046 -1208.8
## + stab.glu:frame     2 0.0008957 0.19070 -1208.6
## + ratio:frame        2 0.0008808 0.19071 -1208.6
## + frame:waist        2 0.0006189 0.19097 -1208.3
## + frame:hip          2 0.0003299 0.19126 -1208.0
## + age:frame          2 0.0002496 0.19134 -1208.0
## + chol:frame         2 0.0001026 0.19149 -1207.8
## - age:bp.1d          1 0.0076666 0.19926 -1206.5
## - hdl:ratio          1 0.0100187 0.20161 -1204.4
## - chol               1 0.0100677 0.20166 -1204.3
## - stab.glu:gender    1 0.0150229 0.20661 -1199.9
## 
## Step:  AIC=-1213.74
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + location + age + 
##     gender + height + weight + bp.1s + bp.1d + waist + hip + 
##     time.ppn + stab.glu:gender + hdl:ratio + age:bp.1d + age:gender + 
##     weight:bp.1s
## 
##                     Df Sum of Sq     RSS     AIC
## + age:hip            1 0.0042291 0.18945 -1215.8
## - location           1 0.0002111 0.19389 -1215.5
## + hip:time.ppn       1 0.0036810 0.18999 -1215.2
## + location:bp.1d     1 0.0034370 0.19024 -1215.0
## + gender:height      1 0.0034173 0.19026 -1215.0
## + stab.glu:bp.1s     1 0.0030011 0.19068 -1214.6
## + age:weight         1 0.0027785 0.19090 -1214.4
## - hip                1 0.0014928 0.19517 -1214.3
## + stab.glu:time.ppn  1 0.0026227 0.19105 -1214.2
## + location:height    1 0.0025587 0.19112 -1214.2
## + stab.glu:location  1 0.0024928 0.19118 -1214.1
## + stab.glu:age       1 0.0023789 0.19130 -1214.0
## + gender:time.ppn    1 0.0022088 0.19147 -1213.8
## <none>                           0.19368 -1213.7
## + hdl:time.ppn       1 0.0019835 0.19169 -1213.6
## - height             1 0.0023105 0.19599 -1213.6
## + stab.glu:ratio     1 0.0017093 0.19197 -1213.4
## + hdl:weight         1 0.0016714 0.19201 -1213.3
## + location:waist     1 0.0016454 0.19203 -1213.3
## - waist              1 0.0027450 0.19642 -1213.2
## + age:waist          1 0.0014405 0.19224 -1213.1
## + hdl:hip            1 0.0014213 0.19226 -1213.1
## + waist:time.ppn     1 0.0014136 0.19226 -1213.1
## + age:time.ppn       1 0.0013894 0.19229 -1213.1
## + bp.1s:time.ppn     1 0.0013819 0.19229 -1213.0
## + ratio:time.ppn     1 0.0013809 0.19229 -1213.0
## + location:gender    1 0.0013699 0.19231 -1213.0
## + location:weight    1 0.0012596 0.19242 -1212.9
## - time.ppn           1 0.0030439 0.19672 -1212.9
## + weight:time.ppn    1 0.0010258 0.19265 -1212.7
## + height:time.ppn    1 0.0008703 0.19281 -1212.6
## + height:bp.1s       1 0.0008279 0.19285 -1212.5
## + height:weight      1 0.0008232 0.19285 -1212.5
## + location:hip       1 0.0007867 0.19289 -1212.5
## + weight:hip         1 0.0007725 0.19290 -1212.5
## + hdl:gender         1 0.0007378 0.19294 -1212.4
## + hdl:age            1 0.0007190 0.19296 -1212.4
## + ratio:bp.1d        1 0.0007022 0.19297 -1212.4
## + chol:location      1 0.0006868 0.19299 -1212.4
## + chol:weight        1 0.0006399 0.19304 -1212.3
## + location:age       1 0.0005917 0.19309 -1212.3
## + chol:age           1 0.0005188 0.19316 -1212.2
## + ratio:gender       1 0.0005077 0.19317 -1212.2
## + hdl:bp.1d          1 0.0004999 0.19318 -1212.2
## + location:time.ppn  1 0.0004954 0.19318 -1212.2
## + ratio:bp.1s        1 0.0004862 0.19319 -1212.2
## + gender:bp.1s       1 0.0004673 0.19321 -1212.2
## + hdl:waist          1 0.0004379 0.19324 -1212.2
## + bp.1d:time.ppn     1 0.0004184 0.19326 -1212.1
## + bp.1s:waist        1 0.0004126 0.19326 -1212.1
## + ratio:hip          1 0.0003916 0.19329 -1212.1
## + chol:hdl           1 0.0003780 0.19330 -1212.1
## + stab.glu:bp.1d     1 0.0003723 0.19330 -1212.1
## + chol:gender        1 0.0003437 0.19333 -1212.1
## + height:bp.1d       1 0.0003357 0.19334 -1212.1
## + chol:ratio         1 0.0003250 0.19335 -1212.0
## + stab.glu:height    1 0.0003082 0.19337 -1212.0
## + hdl:height         1 0.0002386 0.19344 -1212.0
## + gender:hip         1 0.0002351 0.19344 -1212.0
## + bp.1d:hip          1 0.0002284 0.19345 -1212.0
## + location:bp.1s     1 0.0002269 0.19345 -1212.0
## + chol:stab.glu      1 0.0002134 0.19346 -1211.9
## + bp.1s:hip          1 0.0001945 0.19348 -1211.9
## + chol:hip           1 0.0001786 0.19350 -1211.9
## + stab.glu:weight    1 0.0001589 0.19352 -1211.9
## + bp.1s:bp.1d        1 0.0001454 0.19353 -1211.9
## + chol:waist         1 0.0001438 0.19353 -1211.9
## + chol:bp.1s         1 0.0001345 0.19354 -1211.9
## + ratio:weight       1 0.0001216 0.19356 -1211.9
## + weight:waist       1 0.0001197 0.19356 -1211.9
## + stab.glu:hdl       1 0.0001133 0.19356 -1211.8
## + height:hip         1 0.0001053 0.19357 -1211.8
## + ratio:height       1 0.0000993 0.19358 -1211.8
## + chol:time.ppn      1 0.0000952 0.19358 -1211.8
## + height:waist       1 0.0000802 0.19360 -1211.8
## + ratio:location     1 0.0000784 0.19360 -1211.8
## + waist:hip          1 0.0000708 0.19360 -1211.8
## + gender:weight      1 0.0000677 0.19361 -1211.8
## + chol:bp.1d         1 0.0000645 0.19361 -1211.8
## + ratio:age          1 0.0000644 0.19361 -1211.8
## + bp.1d:waist        1 0.0000535 0.19362 -1211.8
## + weight:bp.1d       1 0.0000476 0.19363 -1211.8
## + stab.glu:hip       1 0.0000472 0.19363 -1211.8
## + age:bp.1s          1 0.0000418 0.19364 -1211.8
## + stab.glu:waist     1 0.0000393 0.19364 -1211.8
## + hdl:location       1 0.0000330 0.19364 -1211.8
## + gender:waist       1 0.0000253 0.19365 -1211.8
## + age:height         1 0.0000236 0.19365 -1211.8
## + gender:bp.1d       1 0.0000060 0.19367 -1211.8
## + hdl:bp.1s          1 0.0000042 0.19367 -1211.8
## + ratio:waist        1 0.0000011 0.19368 -1211.7
## + chol:height        1 0.0000001 0.19368 -1211.7
## + frame              2 0.0020849 0.19159 -1211.7
## - age:gender         1 0.0044274 0.19810 -1211.6
## - weight:bp.1s       1 0.0048403 0.19852 -1211.2
## - age:bp.1d          1 0.0085062 0.20218 -1207.9
## - chol               1 0.0100533 0.20373 -1206.5
## - hdl:ratio          1 0.0103579 0.20403 -1206.2
## - stab.glu:gender    1 0.0158797 0.20956 -1201.3
## 
## Step:  AIC=-1215.78
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + location + age + 
##     gender + height + weight + bp.1s + bp.1d + waist + hip + 
##     time.ppn + stab.glu:gender + hdl:ratio + age:bp.1d + age:gender + 
##     weight:bp.1s + age:hip
## 
##                     Df Sum of Sq     RSS     AIC
## + hip:time.ppn       1 0.0049870 0.18446 -1218.7
## - location           1 0.0001770 0.18962 -1217.6
## + gender:height      1 0.0036423 0.18580 -1217.3
## + stab.glu:bp.1s     1 0.0034095 0.18604 -1217.1
## + location:bp.1d     1 0.0030641 0.18638 -1216.8
## - age:gender         1 0.0015493 0.19100 -1216.3
## + location:height    1 0.0025360 0.18691 -1216.2
## + stab.glu:location  1 0.0020820 0.18737 -1215.8
## + hdl:time.ppn       1 0.0020697 0.18738 -1215.8
## <none>                           0.18945 -1215.8
## + location:waist     1 0.0020476 0.18740 -1215.8
## + weight:time.ppn    1 0.0019400 0.18751 -1215.7
## - height             1 0.0022427 0.19169 -1215.6
## + stab.glu:age       1 0.0018899 0.18756 -1215.6
## + gender:time.ppn    1 0.0017838 0.18766 -1215.5
## + stab.glu:time.ppn  1 0.0016459 0.18780 -1215.4
## + hdl:age            1 0.0016423 0.18780 -1215.4
## + hdl:weight         1 0.0015200 0.18793 -1215.3
## + location:weight    1 0.0015196 0.18793 -1215.3
## + location:gender    1 0.0013446 0.18810 -1215.1
## + ratio:time.ppn     1 0.0013226 0.18812 -1215.1
## + waist:time.ppn     1 0.0013208 0.18813 -1215.1
## + chol:weight        1 0.0012771 0.18817 -1215.0
## + bp.1d:hip          1 0.0012603 0.18819 -1215.0
## + hdl:hip            1 0.0012496 0.18820 -1215.0
## - waist              1 0.0029498 0.19240 -1215.0
## + bp.1s:waist        1 0.0010850 0.18836 -1214.8
## + stab.glu:ratio     1 0.0010804 0.18837 -1214.8
## + ratio:bp.1d        1 0.0010080 0.18844 -1214.8
## + bp.1d:waist        1 0.0009418 0.18851 -1214.7
## + chol:hip           1 0.0008470 0.18860 -1214.6
## + location:hip       1 0.0008435 0.18860 -1214.6
## - time.ppn           1 0.0033375 0.19279 -1214.6
## + bp.1s:time.ppn     1 0.0007738 0.18867 -1214.5
## + bp.1s:hip          1 0.0007312 0.18872 -1214.5
## + hdl:gender         1 0.0007236 0.18872 -1214.5
## + chol:hdl           1 0.0006802 0.18877 -1214.4
## + gender:bp.1s       1 0.0006780 0.18877 -1214.4
## + chol:age           1 0.0006590 0.18879 -1214.4
## + chol:location      1 0.0006239 0.18882 -1214.4
## + height:bp.1s       1 0.0006199 0.18883 -1214.4
## + gender:hip         1 0.0006194 0.18883 -1214.4
## + age:waist          1 0.0006156 0.18883 -1214.4
## + weight:bp.1d       1 0.0005900 0.18886 -1214.3
## + location:age       1 0.0005835 0.18886 -1214.3
## + bp.1d:time.ppn     1 0.0005494 0.18890 -1214.3
## + chol:ratio         1 0.0005190 0.18893 -1214.3
## + hdl:bp.1d          1 0.0005125 0.18893 -1214.3
## + stab.glu:bp.1d     1 0.0005078 0.18894 -1214.3
## + stab.glu:weight    1 0.0005063 0.18894 -1214.3
## + stab.glu:hip       1 0.0005013 0.18895 -1214.3
## + height:time.ppn    1 0.0004930 0.18895 -1214.3
## + ratio:gender       1 0.0004906 0.18896 -1214.3
## + height:weight      1 0.0004819 0.18896 -1214.2
## + height:bp.1d       1 0.0004679 0.18898 -1214.2
## + age:time.ppn       1 0.0004558 0.18899 -1214.2
## + chol:waist         1 0.0004174 0.18903 -1214.2
## + ratio:bp.1s        1 0.0004045 0.18904 -1214.2
## + chol:gender        1 0.0003830 0.18906 -1214.2
## + location:time.ppn  1 0.0003661 0.18908 -1214.1
## + ratio:age          1 0.0003068 0.18914 -1214.1
## + hdl:height         1 0.0002622 0.18918 -1214.0
## + gender:weight      1 0.0002524 0.18920 -1214.0
## + ratio:waist        1 0.0002480 0.18920 -1214.0
## + stab.glu:waist     1 0.0002465 0.18920 -1214.0
## + gender:waist       1 0.0002245 0.18922 -1214.0
## + bp.1s:bp.1d        1 0.0002031 0.18924 -1214.0
## + age:bp.1s          1 0.0001837 0.18926 -1214.0
## + hdl:waist          1 0.0001744 0.18927 -1214.0
## + chol:time.ppn      1 0.0001607 0.18929 -1213.9
## + hdl:location       1 0.0001477 0.18930 -1213.9
## + stab.glu:height    1 0.0001463 0.18930 -1213.9
## + age:height         1 0.0001382 0.18931 -1213.9
## + chol:stab.glu      1 0.0001151 0.18933 -1213.9
## + location:bp.1s     1 0.0001072 0.18934 -1213.9
## + weight:hip         1 0.0001045 0.18934 -1213.9
## + ratio:height       1 0.0001032 0.18934 -1213.9
## + age:weight         1 0.0000738 0.18937 -1213.8
## + chol:bp.1s         1 0.0000669 0.18938 -1213.8
## + gender:bp.1d       1 0.0000475 0.18940 -1213.8
## + weight:waist       1 0.0000356 0.18941 -1213.8
## + ratio:hip          1 0.0000294 0.18942 -1213.8
## + chol:bp.1d         1 0.0000122 0.18943 -1213.8
## + waist:hip          1 0.0000088 0.18944 -1213.8
## + hdl:bp.1s          1 0.0000088 0.18944 -1213.8
## + height:hip         1 0.0000065 0.18944 -1213.8
## + height:waist       1 0.0000030 0.18944 -1213.8
## + chol:height        1 0.0000016 0.18945 -1213.8
## + ratio:location     1 0.0000008 0.18945 -1213.8
## + stab.glu:hdl       1 0.0000007 0.18945 -1213.8
## + ratio:weight       1 0.0000001 0.18945 -1213.8
## - age:hip            1 0.0042291 0.19368 -1213.7
## + frame              2 0.0014034 0.18804 -1213.1
## - weight:bp.1s       1 0.0073442 0.19679 -1210.8
## - chol               1 0.0108171 0.20026 -1207.6
## - hdl:ratio          1 0.0114876 0.20094 -1207.0
## - age:bp.1d          1 0.0117556 0.20120 -1206.8
## - stab.glu:gender    1 0.0143590 0.20381 -1204.4
## 
## Step:  AIC=-1218.66
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + location + age + 
##     gender + height + weight + bp.1s + bp.1d + waist + hip + 
##     time.ppn + stab.glu:gender + hdl:ratio + age:bp.1d + age:gender + 
##     weight:bp.1s + age:hip + hip:time.ppn
## 
##                     Df Sum of Sq     RSS     AIC
## + gender:height      1 0.0039509 0.18051 -1220.6
## + stab.glu:bp.1s     1 0.0038363 0.18062 -1220.5
## - location           1 0.0002171 0.18468 -1220.5
## - age:gender         1 0.0011514 0.18561 -1219.5
## + location:bp.1d     1 0.0023663 0.18209 -1219.0
## + hdl:age            1 0.0020476 0.18241 -1218.7
## + location:height    1 0.0020449 0.18241 -1218.7
## - height             1 0.0020064 0.18647 -1218.7
## <none>                           0.18446 -1218.7
## + stab.glu:location  1 0.0019636 0.18250 -1218.6
## + bp.1s:waist        1 0.0016023 0.18286 -1218.3
## + age:waist          1 0.0015496 0.18291 -1218.2
## + location:gender    1 0.0015338 0.18293 -1218.2
## + stab.glu:age       1 0.0014531 0.18301 -1218.1
## + stab.glu:time.ppn  1 0.0013537 0.18311 -1218.0
## + ratio:bp.1d        1 0.0013277 0.18313 -1218.0
## + hdl:weight         1 0.0012711 0.18319 -1217.9
## + chol:weight        1 0.0012676 0.18319 -1217.9
## + waist:time.ppn     1 0.0011015 0.18336 -1217.8
## + stab.glu:weight    1 0.0010634 0.18340 -1217.7
## + location:waist     1 0.0010590 0.18340 -1217.7
## + chol:hdl           1 0.0010521 0.18341 -1217.7
## + weight:time.ppn    1 0.0009896 0.18347 -1217.7
## + hdl:hip            1 0.0009817 0.18348 -1217.6
## - waist              1 0.0031504 0.18761 -1217.6
## + gender:bp.1s       1 0.0008861 0.18357 -1217.5
## + chol:hip           1 0.0008453 0.18362 -1217.5
## + hdl:bp.1d          1 0.0008347 0.18363 -1217.5
## + location:age       1 0.0008267 0.18363 -1217.5
## + stab.glu:ratio     1 0.0007948 0.18366 -1217.5
## + bp.1d:hip          1 0.0007924 0.18367 -1217.5
## + location:weight    1 0.0007388 0.18372 -1217.4
## + ratio:bp.1s        1 0.0007310 0.18373 -1217.4
## + stab.glu:bp.1d     1 0.0007307 0.18373 -1217.4
## + stab.glu:hip       1 0.0007048 0.18376 -1217.4
## + bp.1s:time.ppn     1 0.0006608 0.18380 -1217.3
## + chol:age           1 0.0006554 0.18380 -1217.3
## + chol:ratio         1 0.0006290 0.18383 -1217.3
## + hdl:gender         1 0.0006049 0.18385 -1217.3
## + stab.glu:waist     1 0.0005898 0.18387 -1217.2
## + gender:time.ppn    1 0.0005637 0.18390 -1217.2
## + height:weight      1 0.0005611 0.18390 -1217.2
## + age:bp.1s          1 0.0005366 0.18392 -1217.2
## + height:bp.1s       1 0.0005169 0.18394 -1217.2
## + bp.1s:hip          1 0.0004984 0.18396 -1217.2
## + weight:hip         1 0.0004822 0.18398 -1217.1
## + chol:waist         1 0.0004802 0.18398 -1217.1
## + ratio:age          1 0.0004694 0.18399 -1217.1
## + gender:hip         1 0.0004578 0.18400 -1217.1
## + chol:location      1 0.0004288 0.18403 -1217.1
## + ratio:gender       1 0.0004284 0.18403 -1217.1
## + hdl:location       1 0.0004108 0.18405 -1217.1
## + bp.1d:waist        1 0.0004076 0.18405 -1217.1
## + hdl:time.ppn       1 0.0004024 0.18406 -1217.1
## + height:time.ppn    1 0.0003769 0.18408 -1217.0
## + ratio:waist        1 0.0003706 0.18409 -1217.0
## + weight:waist       1 0.0003514 0.18411 -1217.0
## + chol:gender        1 0.0003141 0.18415 -1217.0
## + age:time.ppn       1 0.0003118 0.18415 -1217.0
## + bp.1s:bp.1d        1 0.0003038 0.18416 -1217.0
## + gender:weight      1 0.0002910 0.18417 -1217.0
## + gender:waist       1 0.0002810 0.18418 -1216.9
## + location:hip       1 0.0002736 0.18419 -1216.9
## + ratio:time.ppn     1 0.0002707 0.18419 -1216.9
## + hdl:height         1 0.0002259 0.18423 -1216.9
## + location:time.ppn  1 0.0002208 0.18424 -1216.9
## + waist:hip          1 0.0001922 0.18427 -1216.9
## + weight:bp.1d       1 0.0001889 0.18427 -1216.8
## + stab.glu:height    1 0.0001781 0.18428 -1216.8
## + bp.1d:time.ppn     1 0.0001393 0.18432 -1216.8
## + chol:time.ppn      1 0.0001389 0.18432 -1216.8
## + hdl:waist          1 0.0001274 0.18433 -1216.8
## + chol:bp.1s         1 0.0000835 0.18438 -1216.8
## + ratio:height       1 0.0000733 0.18439 -1216.7
## + height:bp.1d       1 0.0000689 0.18439 -1216.7
## + chol:stab.glu      1 0.0000558 0.18440 -1216.7
## + age:weight         1 0.0000553 0.18441 -1216.7
## + ratio:location     1 0.0000459 0.18441 -1216.7
## + age:height         1 0.0000418 0.18442 -1216.7
## + chol:bp.1d         1 0.0000285 0.18443 -1216.7
## + gender:bp.1d       1 0.0000215 0.18444 -1216.7
## + location:bp.1s     1 0.0000174 0.18444 -1216.7
## + ratio:weight       1 0.0000139 0.18445 -1216.7
## + stab.glu:hdl       1 0.0000060 0.18445 -1216.7
## + ratio:hip          1 0.0000051 0.18446 -1216.7
## + hdl:bp.1s          1 0.0000017 0.18446 -1216.7
## + height:hip         1 0.0000011 0.18446 -1216.7
## + chol:height        1 0.0000006 0.18446 -1216.7
## + height:waist       1 0.0000003 0.18446 -1216.7
## + frame              2 0.0014238 0.18304 -1216.1
## - hip:time.ppn       1 0.0049870 0.18945 -1215.8
## - age:hip            1 0.0055351 0.18999 -1215.2
## - weight:bp.1s       1 0.0078078 0.19227 -1213.1
## - age:bp.1d          1 0.0095073 0.19397 -1211.5
## - chol               1 0.0110043 0.19546 -1210.1
## - hdl:ratio          1 0.0119007 0.19636 -1209.2
## - stab.glu:gender    1 0.0139289 0.19839 -1207.3
## 
## Step:  AIC=-1220.63
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + location + age + 
##     gender + height + weight + bp.1s + bp.1d + waist + hip + 
##     time.ppn + stab.glu:gender + hdl:ratio + age:bp.1d + age:gender + 
##     weight:bp.1s + age:hip + hip:time.ppn + gender:height
## 
##                     Df Sum of Sq     RSS     AIC
## + stab.glu:bp.1s     1 0.0047065 0.17580 -1223.5
## - location           1 0.0002576 0.18077 -1222.4
## + location:bp.1d     1 0.0033116 0.17720 -1222.0
## + stab.glu:location  1 0.0026427 0.17787 -1221.3
## + hdl:age            1 0.0025462 0.17796 -1221.2
## <none>                           0.18051 -1220.6
## - age:gender         1 0.0021003 0.18261 -1220.5
## + stab.glu:age       1 0.0018064 0.17870 -1220.5
## + hdl:weight         1 0.0017224 0.17879 -1220.4
## + ratio:bp.1d        1 0.0017061 0.17880 -1220.4
## + bp.1d:hip          1 0.0014169 0.17909 -1220.1
## + chol:hdl           1 0.0013896 0.17912 -1220.0
## + stab.glu:time.ppn  1 0.0013594 0.17915 -1220.0
## + height:hip         1 0.0013424 0.17917 -1220.0
## + age:waist          1 0.0012977 0.17921 -1220.0
## + bp.1s:waist        1 0.0012961 0.17921 -1220.0
## + stab.glu:bp.1d     1 0.0012758 0.17923 -1219.9
## + height:bp.1s       1 0.0011836 0.17933 -1219.8
## + chol:weight        1 0.0011144 0.17939 -1219.8
## + bp.1d:waist        1 0.0011083 0.17940 -1219.8
## + hdl:hip            1 0.0010517 0.17946 -1219.7
## + weight:hip         1 0.0009922 0.17952 -1219.6
## + hdl:bp.1d          1 0.0009449 0.17956 -1219.6
## + location:height    1 0.0008968 0.17961 -1219.5
## + location:age       1 0.0008783 0.17963 -1219.5
## + stab.glu:ratio     1 0.0008336 0.17968 -1219.5
## + stab.glu:weight    1 0.0008041 0.17971 -1219.4
## + hdl:location       1 0.0008012 0.17971 -1219.4
## + waist:time.ppn     1 0.0007725 0.17974 -1219.4
## + location:gender    1 0.0007620 0.17975 -1219.4
## + chol:age           1 0.0007550 0.17975 -1219.4
## + height:weight      1 0.0007532 0.17976 -1219.4
## + ratio:bp.1s        1 0.0007461 0.17976 -1219.4
## + location:waist     1 0.0007448 0.17976 -1219.4
## + ratio:gender       1 0.0006778 0.17983 -1219.3
## + hdl:gender         1 0.0006579 0.17985 -1219.3
## - waist              1 0.0033400 0.18385 -1219.3
## + location:weight    1 0.0006282 0.17988 -1219.3
## + weight:time.ppn    1 0.0005697 0.17994 -1219.2
## + stab.glu:hip       1 0.0005427 0.17997 -1219.2
## + ratio:age          1 0.0005401 0.17997 -1219.2
## + gender:bp.1s       1 0.0005181 0.17999 -1219.2
## + weight:bp.1d       1 0.0005059 0.18000 -1219.1
## + hdl:height         1 0.0004820 0.18003 -1219.1
## + weight:waist       1 0.0004602 0.18005 -1219.1
## + chol:time.ppn      1 0.0004585 0.18005 -1219.1
## + bp.1s:time.ppn     1 0.0004584 0.18005 -1219.1
## + chol:hip           1 0.0004584 0.18005 -1219.1
## + hdl:time.ppn       1 0.0004435 0.18007 -1219.1
## + waist:hip          1 0.0004054 0.18010 -1219.0
## + chol:ratio         1 0.0004053 0.18010 -1219.0
## + chol:location      1 0.0004023 0.18011 -1219.0
## + age:bp.1s          1 0.0003827 0.18013 -1219.0
## + stab.glu:waist     1 0.0003415 0.18017 -1219.0
## + location:hip       1 0.0003035 0.18021 -1218.9
## + height:waist       1 0.0002778 0.18023 -1218.9
## + bp.1s:hip          1 0.0002756 0.18023 -1218.9
## + chol:waist         1 0.0002461 0.18026 -1218.9
## + age:time.ppn       1 0.0002449 0.18026 -1218.9
## + hdl:waist          1 0.0002203 0.18029 -1218.8
## + gender:time.ppn    1 0.0002151 0.18029 -1218.8
## + chol:bp.1s         1 0.0002018 0.18031 -1218.8
## + ratio:location     1 0.0001903 0.18032 -1218.8
## + gender:hip         1 0.0001737 0.18034 -1218.8
## + ratio:time.ppn     1 0.0001720 0.18034 -1218.8
## + height:bp.1d       1 0.0001098 0.18040 -1218.7
## + age:weight         1 0.0001072 0.18040 -1218.7
## + ratio:waist        1 0.0001020 0.18041 -1218.7
## + chol:gender        1 0.0000996 0.18041 -1218.7
## + bp.1d:time.ppn     1 0.0000959 0.18041 -1218.7
## + chol:stab.glu      1 0.0000939 0.18041 -1218.7
## + bp.1s:bp.1d        1 0.0000763 0.18043 -1218.7
## + ratio:hip          1 0.0000754 0.18043 -1218.7
## + ratio:height       1 0.0000745 0.18044 -1218.7
## + age:height         1 0.0000734 0.18044 -1218.7
## + location:time.ppn  1 0.0000691 0.18044 -1218.7
## + gender:waist       1 0.0000690 0.18044 -1218.7
## + location:bp.1s     1 0.0000659 0.18044 -1218.7
## + height:time.ppn    1 0.0000612 0.18045 -1218.7
## + chol:height        1 0.0000500 0.18046 -1218.7
## - gender:height      1 0.0039509 0.18446 -1218.7
## + hdl:bp.1s          1 0.0000194 0.18049 -1218.7
## + ratio:weight       1 0.0000148 0.18049 -1218.6
## + gender:bp.1d       1 0.0000061 0.18050 -1218.6
## + stab.glu:height    1 0.0000053 0.18050 -1218.6
## + stab.glu:hdl       1 0.0000009 0.18051 -1218.6
## + gender:weight      1 0.0000007 0.18051 -1218.6
## + chol:bp.1d         1 0.0000002 0.18051 -1218.6
## + frame              2 0.0016747 0.17883 -1218.3
## - hip:time.ppn       1 0.0052956 0.18580 -1217.3
## - age:hip            1 0.0058457 0.18635 -1216.8
## - weight:bp.1s       1 0.0068691 0.18738 -1215.8
## - age:bp.1d          1 0.0093701 0.18988 -1213.4
## - chol               1 0.0108714 0.19138 -1211.9
## - hdl:ratio          1 0.0118922 0.19240 -1211.0
## - stab.glu:gender    1 0.0145552 0.19506 -1208.4
## 
## Step:  AIC=-1223.46
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + location + age + 
##     gender + height + weight + bp.1s + bp.1d + waist + hip + 
##     time.ppn + stab.glu:gender + hdl:ratio + age:bp.1d + age:gender + 
##     weight:bp.1s + age:hip + hip:time.ppn + gender:height + stab.glu:bp.1s
## 
##                     Df Sum of Sq     RSS     AIC
## - location           1 0.0000425 0.17585 -1225.4
## + location:bp.1d     1 0.0029346 0.17287 -1224.5
## + hdl:age            1 0.0029190 0.17288 -1224.5
## + bp.1s:waist        1 0.0022289 0.17357 -1223.8
## + stab.glu:time.ppn  1 0.0021740 0.17363 -1223.7
## + hdl:weight         1 0.0021642 0.17364 -1223.7
## + chol:hdl           1 0.0020840 0.17372 -1223.6
## <none>                           0.17580 -1223.5
## - age:gender         1 0.0020592 0.17786 -1223.3
## + chol:weight        1 0.0017244 0.17408 -1223.3
## + age:waist          1 0.0015951 0.17421 -1223.1
## + height:hip         1 0.0014390 0.17436 -1223.0
## + stab.glu:location  1 0.0014371 0.17437 -1223.0
## + height:bp.1s       1 0.0012788 0.17452 -1222.8
## + stab.glu:waist     1 0.0012251 0.17458 -1222.7
## + weight:hip         1 0.0011412 0.17466 -1222.7
## + chol:hip           1 0.0010761 0.17473 -1222.6
## + ratio:age          1 0.0010564 0.17475 -1222.6
## + waist:time.ppn     1 0.0009891 0.17481 -1222.5
## + hdl:hip            1 0.0009518 0.17485 -1222.5
## + location:height    1 0.0009483 0.17485 -1222.5
## + stab.glu:height    1 0.0009061 0.17490 -1222.4
## + location:age       1 0.0008546 0.17495 -1222.3
## + ratio:bp.1d        1 0.0008448 0.17496 -1222.3
## + bp.1d:hip          1 0.0008258 0.17498 -1222.3
## + hdl:location       1 0.0007923 0.17501 -1222.3
## + stab.glu:hip       1 0.0007861 0.17502 -1222.3
## + height:weight      1 0.0007710 0.17503 -1222.3
## + bp.1d:waist        1 0.0007627 0.17504 -1222.3
## + age:bp.1s          1 0.0007624 0.17504 -1222.3
## + hdl:height         1 0.0007342 0.17507 -1222.2
## + gender:bp.1s       1 0.0007250 0.17508 -1222.2
## + chol:ratio         1 0.0006655 0.17514 -1222.2
## + weight:time.ppn    1 0.0006545 0.17515 -1222.1
## + chol:waist         1 0.0006521 0.17515 -1222.1
## + bp.1s:time.ppn     1 0.0006457 0.17516 -1222.1
## + chol:location      1 0.0006135 0.17519 -1222.1
## + stab.glu:weight    1 0.0005677 0.17524 -1222.0
## + location:waist     1 0.0005587 0.17524 -1222.0
## + waist:hip          1 0.0005238 0.17528 -1222.0
## + bp.1s:hip          1 0.0005227 0.17528 -1222.0
## + location:weight    1 0.0004772 0.17533 -1222.0
## + chol:time.ppn      1 0.0004696 0.17533 -1222.0
## + weight:waist       1 0.0004659 0.17534 -1222.0
## + bp.1s:bp.1d        1 0.0004637 0.17534 -1222.0
## + location:gender    1 0.0004634 0.17534 -1221.9
## + weight:bp.1d       1 0.0004130 0.17539 -1221.9
## + ratio:gender       1 0.0004079 0.17539 -1221.9
## + hdl:gender         1 0.0004031 0.17540 -1221.9
## + chol:age           1 0.0004007 0.17540 -1221.9
## + hdl:bp.1s          1 0.0003932 0.17541 -1221.9
## + hdl:time.ppn       1 0.0003916 0.17541 -1221.9
## + gender:time.ppn    1 0.0003622 0.17544 -1221.8
## + hdl:bp.1d          1 0.0003540 0.17545 -1221.8
## + location:hip       1 0.0003514 0.17545 -1221.8
## + chol:bp.1s         1 0.0003068 0.17550 -1221.8
## + ratio:height       1 0.0002855 0.17552 -1221.8
## + height:waist       1 0.0002825 0.17552 -1221.8
## + ratio:waist        1 0.0002796 0.17552 -1221.8
## + age:time.ppn       1 0.0002573 0.17555 -1221.7
## + hdl:waist          1 0.0002081 0.17560 -1221.7
## + gender:hip         1 0.0001787 0.17562 -1221.7
## + location:time.ppn  1 0.0001786 0.17562 -1221.7
## + height:time.ppn    1 0.0001450 0.17566 -1221.6
## + height:bp.1d       1 0.0001274 0.17567 -1221.6
## + location:bp.1s     1 0.0001159 0.17569 -1221.6
## + ratio:time.ppn     1 0.0001137 0.17569 -1221.6
## + ratio:location     1 0.0001064 0.17570 -1221.6
## - waist              1 0.0037869 0.17959 -1221.6
## + chol:gender        1 0.0000960 0.17571 -1221.6
## + gender:bp.1d       1 0.0000923 0.17571 -1221.6
## + age:weight         1 0.0000876 0.17572 -1221.5
## + stab.glu:hdl       1 0.0000812 0.17572 -1221.5
## + gender:waist       1 0.0000656 0.17574 -1221.5
## + chol:stab.glu      1 0.0000458 0.17576 -1221.5
## + ratio:weight       1 0.0000422 0.17576 -1221.5
## + bp.1d:time.ppn     1 0.0000372 0.17577 -1221.5
## + chol:height        1 0.0000346 0.17577 -1221.5
## + age:height         1 0.0000268 0.17578 -1221.5
## + ratio:bp.1s        1 0.0000228 0.17578 -1221.5
## + stab.glu:age       1 0.0000170 0.17579 -1221.5
## + chol:bp.1d         1 0.0000158 0.17579 -1221.5
## + stab.glu:ratio     1 0.0000156 0.17579 -1221.5
## + ratio:hip          1 0.0000087 0.17579 -1221.5
## + gender:weight      1 0.0000047 0.17580 -1221.5
## + stab.glu:bp.1d     1 0.0000000 0.17580 -1221.5
## - stab.glu:bp.1s     1 0.0047065 0.18051 -1220.6
## - gender:height      1 0.0048211 0.18062 -1220.5
## + frame              2 0.0009610 0.17484 -1220.5
## - hip:time.ppn       1 0.0058215 0.18162 -1219.5
## - age:hip            1 0.0065138 0.18232 -1218.8
## - weight:bp.1s       1 0.0090528 0.18486 -1216.3
## - age:bp.1d          1 0.0111104 0.18691 -1214.2
## - chol               1 0.0113497 0.18715 -1214.0
## - hdl:ratio          1 0.0125241 0.18833 -1212.9
## - stab.glu:gender    1 0.0135075 0.18931 -1211.9
## 
## Step:  AIC=-1225.42
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + age + gender + 
##     height + weight + bp.1s + bp.1d + waist + hip + time.ppn + 
##     stab.glu:gender + hdl:ratio + age:bp.1d + age:gender + weight:bp.1s + 
##     age:hip + hip:time.ppn + gender:height + stab.glu:bp.1s
## 
##                     Df Sum of Sq     RSS     AIC
## + hdl:age            1 0.0027271 0.17312 -1226.3
## + bp.1s:waist        1 0.0022300 0.17361 -1225.8
## + stab.glu:time.ppn  1 0.0022166 0.17363 -1225.7
## + hdl:weight         1 0.0021098 0.17374 -1225.6
## + chol:hdl           1 0.0020589 0.17379 -1225.6
## <none>                           0.17585 -1225.4
## - age:gender         1 0.0020322 0.17788 -1225.3
## + chol:weight        1 0.0016978 0.17415 -1225.2
## + age:waist          1 0.0015909 0.17425 -1225.1
## + height:hip         1 0.0014442 0.17440 -1224.9
## + height:bp.1s       1 0.0012034 0.17464 -1224.7
## + stab.glu:waist     1 0.0011466 0.17470 -1224.6
## + weight:hip         1 0.0010960 0.17475 -1224.6
## + chol:hip           1 0.0010373 0.17481 -1224.5
## + ratio:age          1 0.0010008 0.17485 -1224.5
## + waist:time.ppn     1 0.0009379 0.17491 -1224.4
## + hdl:hip            1 0.0009361 0.17491 -1224.4
## + stab.glu:height    1 0.0008857 0.17496 -1224.3
## + ratio:bp.1d        1 0.0008662 0.17498 -1224.3
## + bp.1d:hip          1 0.0008607 0.17499 -1224.3
## + bp.1d:waist        1 0.0007954 0.17505 -1224.2
## + height:weight      1 0.0007557 0.17509 -1224.2
## + gender:bp.1s       1 0.0007255 0.17512 -1224.2
## + age:bp.1s          1 0.0007185 0.17513 -1224.2
## + hdl:height         1 0.0007051 0.17514 -1224.2
## + stab.glu:hip       1 0.0006910 0.17515 -1224.1
## + bp.1s:time.ppn     1 0.0006731 0.17517 -1224.1
## + chol:ratio         1 0.0006526 0.17519 -1224.1
## + chol:waist         1 0.0006329 0.17521 -1224.1
## + weight:time.ppn    1 0.0006327 0.17521 -1224.1
## + bp.1s:hip          1 0.0005271 0.17532 -1224.0
## + stab.glu:weight    1 0.0005255 0.17532 -1224.0
## + bp.1s:bp.1d        1 0.0004942 0.17535 -1223.9
## + waist:hip          1 0.0004757 0.17537 -1223.9
## + weight:waist       1 0.0004456 0.17540 -1223.9
## + weight:bp.1d       1 0.0004368 0.17541 -1223.9
## + chol:time.ppn      1 0.0004083 0.17544 -1223.8
## + ratio:gender       1 0.0004064 0.17544 -1223.8
## + hdl:gender         1 0.0004024 0.17544 -1223.8
## + chol:age           1 0.0003889 0.17546 -1223.8
## + hdl:bp.1s          1 0.0003814 0.17546 -1223.8
## + hdl:bp.1d          1 0.0003727 0.17547 -1223.8
## + hdl:time.ppn       1 0.0003693 0.17548 -1223.8
## + gender:time.ppn    1 0.0003414 0.17550 -1223.8
## + chol:bp.1s         1 0.0002993 0.17555 -1223.7
## + height:waist       1 0.0002976 0.17555 -1223.7
## + age:time.ppn       1 0.0002817 0.17556 -1223.7
## + ratio:height       1 0.0002745 0.17557 -1223.7
## + ratio:waist        1 0.0002696 0.17558 -1223.7
## + hdl:waist          1 0.0002131 0.17563 -1223.6
## + gender:hip         1 0.0001851 0.17566 -1223.6
## + height:time.ppn    1 0.0001488 0.17570 -1223.6
## - waist              1 0.0037540 0.17960 -1223.5
## + ratio:time.ppn     1 0.0001203 0.17572 -1223.5
## + height:bp.1d       1 0.0001158 0.17573 -1223.5
## + chol:gender        1 0.0000928 0.17575 -1223.5
## + gender:bp.1d       1 0.0000906 0.17575 -1223.5
## + age:weight         1 0.0000834 0.17576 -1223.5
## + stab.glu:hdl       1 0.0000716 0.17577 -1223.5
## + gender:waist       1 0.0000695 0.17578 -1223.5
## + chol:stab.glu      1 0.0000491 0.17580 -1223.5
## + bp.1d:time.ppn     1 0.0000472 0.17580 -1223.5
## + location           1 0.0000425 0.17580 -1223.5
## + ratio:weight       1 0.0000403 0.17580 -1223.5
## + chol:height        1 0.0000375 0.17581 -1223.5
## + ratio:bp.1s        1 0.0000241 0.17582 -1223.4
## + stab.glu:age       1 0.0000228 0.17582 -1223.4
## + age:height         1 0.0000197 0.17583 -1223.4
## + stab.glu:ratio     1 0.0000170 0.17583 -1223.4
## + chol:bp.1d         1 0.0000142 0.17583 -1223.4
## + ratio:hip          1 0.0000085 0.17584 -1223.4
## + gender:weight      1 0.0000036 0.17584 -1223.4
## + stab.glu:bp.1d     1 0.0000006 0.17585 -1223.4
## - gender:height      1 0.0048151 0.18066 -1222.5
## + frame              2 0.0009262 0.17492 -1222.4
## - stab.glu:bp.1s     1 0.0049216 0.18077 -1222.4
## - hip:time.ppn       1 0.0058091 0.18165 -1221.5
## - age:hip            1 0.0065424 0.18239 -1220.7
## - weight:bp.1s       1 0.0090485 0.18489 -1218.2
## - age:bp.1d          1 0.0110693 0.18691 -1216.2
## - chol               1 0.0115934 0.18744 -1215.7
## - hdl:ratio          1 0.0127421 0.18859 -1214.6
## - stab.glu:gender    1 0.0134663 0.18931 -1213.9
## 
## Step:  AIC=-1226.28
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + age + gender + 
##     height + weight + bp.1s + bp.1d + waist + hip + time.ppn + 
##     stab.glu:gender + hdl:ratio + age:bp.1d + age:gender + weight:bp.1s + 
##     age:hip + hip:time.ppn + gender:height + stab.glu:bp.1s + 
##     hdl:age
## 
##                     Df Sum of Sq     RSS     AIC
## - age:gender         1 0.0011676 0.17429 -1227.0
## + stab.glu:time.ppn  1 0.0024209 0.17070 -1226.8
## <none>                           0.17312 -1226.3
## + height:hip         1 0.0018362 0.17128 -1226.2
## + bp.1s:waist        1 0.0017645 0.17135 -1226.2
## + age:bp.1s          1 0.0016736 0.17144 -1226.1
## + age:waist          1 0.0012839 0.17183 -1225.6
## + height:weight      1 0.0012746 0.17184 -1225.6
## + weight:hip         1 0.0011996 0.17192 -1225.5
## + hdl:hip            1 0.0011941 0.17192 -1225.5
## + height:bp.1s       1 0.0011887 0.17193 -1225.5
## + stab.glu:waist     1 0.0011108 0.17201 -1225.5
## + hdl:weight         1 0.0010921 0.17203 -1225.4
## - hdl:age            1 0.0027271 0.17585 -1225.4
## + chol:weight        1 0.0010269 0.17209 -1225.4
## + bp.1s:time.ppn     1 0.0009751 0.17214 -1225.3
## + hdl:gender         1 0.0009717 0.17215 -1225.3
## + bp.1s:hip          1 0.0009183 0.17220 -1225.2
## + ratio:gender       1 0.0008823 0.17224 -1225.2
## + gender:bp.1s       1 0.0008693 0.17225 -1225.2
## + bp.1d:hip          1 0.0008522 0.17227 -1225.2
## + ratio:bp.1d        1 0.0007844 0.17233 -1225.1
## + chol:hip           1 0.0007832 0.17233 -1225.1
## + ratio:bp.1s        1 0.0006747 0.17244 -1225.0
## + bp.1d:waist        1 0.0006665 0.17245 -1225.0
## + weight:time.ppn    1 0.0006183 0.17250 -1224.9
## + weight:waist       1 0.0005915 0.17253 -1224.9
## + chol:hdl           1 0.0005907 0.17253 -1224.9
## + stab.glu:weight    1 0.0005833 0.17253 -1224.9
## + age:time.ppn       1 0.0005794 0.17254 -1224.9
## + stab.glu:hip       1 0.0005559 0.17256 -1224.9
## + stab.glu:height    1 0.0005262 0.17259 -1224.8
## + hdl:bp.1d          1 0.0004643 0.17265 -1224.8
## + hdl:time.ppn       1 0.0004564 0.17266 -1224.8
## + waist:hip          1 0.0004552 0.17266 -1224.8
## + height:waist       1 0.0004433 0.17267 -1224.8
## + hdl:waist          1 0.0004399 0.17268 -1224.7
## + bp.1s:bp.1d        1 0.0004225 0.17270 -1224.7
## + waist:time.ppn     1 0.0003701 0.17275 -1224.7
## + chol:waist         1 0.0003516 0.17277 -1224.7
## + chol:ratio         1 0.0002926 0.17283 -1224.6
## + weight:bp.1d       1 0.0002855 0.17283 -1224.6
## + chol:time.ppn      1 0.0002781 0.17284 -1224.6
## + gender:hip         1 0.0002501 0.17287 -1224.5
## + ratio:time.ppn     1 0.0002493 0.17287 -1224.5
## + location           1 0.0002345 0.17288 -1224.5
## + bp.1d:time.ppn     1 0.0002062 0.17291 -1224.5
## + gender:time.ppn    1 0.0001585 0.17296 -1224.5
## + height:time.ppn    1 0.0001573 0.17296 -1224.4
## + hdl:bp.1s          1 0.0001391 0.17298 -1224.4
## + stab.glu:ratio     1 0.0001311 0.17299 -1224.4
## + ratio:age          1 0.0001257 0.17299 -1224.4
## + gender:waist       1 0.0001054 0.17301 -1224.4
## + stab.glu:age       1 0.0000969 0.17302 -1224.4
## + age:height         1 0.0000869 0.17303 -1224.4
## + chol:stab.glu      1 0.0000865 0.17303 -1224.4
## + chol:gender        1 0.0000799 0.17304 -1224.4
## + ratio:hip          1 0.0000619 0.17306 -1224.3
## + hdl:height         1 0.0000554 0.17306 -1224.3
## + ratio:waist        1 0.0000509 0.17307 -1224.3
## + chol:age           1 0.0000337 0.17308 -1224.3
## + chol:bp.1s         1 0.0000331 0.17308 -1224.3
## + gender:bp.1d       1 0.0000304 0.17309 -1224.3
## + gender:weight      1 0.0000183 0.17310 -1224.3
## + height:bp.1d       1 0.0000146 0.17310 -1224.3
## + chol:height        1 0.0000119 0.17311 -1224.3
## + ratio:height       1 0.0000105 0.17311 -1224.3
## + chol:bp.1d         1 0.0000078 0.17311 -1224.3
## + stab.glu:hdl       1 0.0000052 0.17311 -1224.3
## + age:weight         1 0.0000043 0.17311 -1224.3
## + ratio:weight       1 0.0000000 0.17312 -1224.3
## + stab.glu:bp.1d     1 0.0000000 0.17312 -1224.3
## - waist              1 0.0041614 0.17728 -1223.9
## + frame              2 0.0006999 0.17242 -1223.0
## - gender:height      1 0.0053986 0.17852 -1222.7
## - stab.glu:bp.1s     1 0.0054455 0.17856 -1222.6
## - hip:time.ppn       1 0.0063351 0.17945 -1221.7
## - weight:bp.1s       1 0.0074613 0.18058 -1220.6
## - age:hip            1 0.0081246 0.18124 -1219.9
## - chol               1 0.0096454 0.18276 -1218.4
## - hdl:ratio          1 0.0109230 0.18404 -1217.1
## - age:bp.1d          1 0.0120359 0.18515 -1216.0
## - stab.glu:gender    1 0.0129175 0.18604 -1215.1
## 
## Step:  AIC=-1227.05
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + age + gender + 
##     height + weight + bp.1s + bp.1d + waist + hip + time.ppn + 
##     stab.glu:gender + hdl:ratio + age:bp.1d + weight:bp.1s + 
##     age:hip + hip:time.ppn + gender:height + stab.glu:bp.1s + 
##     hdl:age
## 
##                     Df Sum of Sq     RSS     AIC
## + stab.glu:time.ppn  1 0.0021611 0.17213 -1227.3
## + age:waist          1 0.0020133 0.17227 -1227.2
## <none>                           0.17429 -1227.0
## + height:hip         1 0.0017195 0.17257 -1226.9
## + age:bp.1s          1 0.0013165 0.17297 -1226.4
## + stab.glu:waist     1 0.0012819 0.17300 -1226.4
## + bp.1s:waist        1 0.0012496 0.17304 -1226.4
## + ratio:gender       1 0.0012490 0.17304 -1226.4
## + bp.1d:hip          1 0.0012176 0.17307 -1226.3
## + age:gender         1 0.0011676 0.17312 -1226.3
## + bp.1d:waist        1 0.0011629 0.17312 -1226.3
## + hdl:gender         1 0.0011620 0.17312 -1226.3
## + hdl:hip            1 0.0011167 0.17317 -1226.2
## + height:weight      1 0.0010891 0.17320 -1226.2
## + chol:weight        1 0.0009884 0.17330 -1226.1
## + weight:hip         1 0.0009520 0.17333 -1226.0
## + ratio:bp.1d        1 0.0009368 0.17335 -1226.0
## + bp.1s:time.ppn     1 0.0008131 0.17347 -1225.9
## + hdl:weight         1 0.0008092 0.17348 -1225.9
## + stab.glu:hip       1 0.0007575 0.17353 -1225.8
## + stab.glu:weight    1 0.0007318 0.17355 -1225.8
## + bp.1s:hip          1 0.0007093 0.17358 -1225.8
## + weight:bp.1d       1 0.0006923 0.17359 -1225.8
## + chol:hip           1 0.0006858 0.17360 -1225.8
## + ratio:bp.1s        1 0.0006804 0.17361 -1225.8
## + hdl:bp.1d          1 0.0006485 0.17364 -1225.7
## + height:bp.1s       1 0.0006068 0.17368 -1225.7
## + height:waist       1 0.0005986 0.17369 -1225.7
## + weight:time.ppn    1 0.0005862 0.17370 -1225.7
## + chol:hdl           1 0.0005839 0.17370 -1225.7
## + weight:waist       1 0.0004950 0.17379 -1225.6
## + age:time.ppn       1 0.0004876 0.17380 -1225.6
## + gender:bp.1s       1 0.0004731 0.17381 -1225.5
## + waist:time.ppn     1 0.0004373 0.17385 -1225.5
## + stab.glu:height    1 0.0003888 0.17390 -1225.5
## + gender:waist       1 0.0003580 0.17393 -1225.4
## + waist:hip          1 0.0003424 0.17394 -1225.4
## + chol:ratio         1 0.0003382 0.17395 -1225.4
## + bp.1s:bp.1d        1 0.0003371 0.17395 -1225.4
## + gender:hip         1 0.0003366 0.17395 -1225.4
## + hdl:time.ppn       1 0.0003109 0.17397 -1225.4
## + chol:waist         1 0.0003024 0.17398 -1225.4
## + age:weight         1 0.0002911 0.17400 -1225.3
## + hdl:waist          1 0.0002765 0.17401 -1225.3
## + age:height         1 0.0002633 0.17402 -1225.3
## - hdl:age            1 0.0035916 0.17788 -1225.3
## + ratio:time.ppn     1 0.0002521 0.17403 -1225.3
## + height:time.ppn    1 0.0002286 0.17406 -1225.3
## + bp.1d:time.ppn     1 0.0002214 0.17406 -1225.3
## + chol:stab.glu      1 0.0002212 0.17406 -1225.3
## + hdl:bp.1s          1 0.0002146 0.17407 -1225.3
## + location           1 0.0002091 0.17408 -1225.3
## + gender:time.ppn    1 0.0001954 0.17409 -1225.2
## + chol:time.ppn      1 0.0001628 0.17412 -1225.2
## + ratio:waist        1 0.0001053 0.17418 -1225.2
## + ratio:age          1 0.0000999 0.17419 -1225.2
## + stab.glu:age       1 0.0000823 0.17420 -1225.1
## + ratio:hip          1 0.0000589 0.17423 -1225.1
## + stab.glu:ratio     1 0.0000581 0.17423 -1225.1
## + gender:bp.1d       1 0.0000542 0.17423 -1225.1
## + chol:age           1 0.0000410 0.17425 -1225.1
## + chol:height        1 0.0000325 0.17425 -1225.1
## + gender:weight      1 0.0000185 0.17427 -1225.1
## + chol:gender        1 0.0000162 0.17427 -1225.1
## + hdl:height         1 0.0000150 0.17427 -1225.1
## + stab.glu:hdl       1 0.0000145 0.17427 -1225.1
## + chol:bp.1s         1 0.0000104 0.17428 -1225.1
## + ratio:weight       1 0.0000089 0.17428 -1225.1
## + height:bp.1d       1 0.0000051 0.17428 -1225.0
## + stab.glu:bp.1d     1 0.0000031 0.17428 -1225.0
## + chol:bp.1d         1 0.0000020 0.17428 -1225.0
## + ratio:height       1 0.0000020 0.17428 -1225.0
## - waist              1 0.0044588 0.17874 -1224.4
## - gender:height      1 0.0046901 0.17898 -1224.2
## + frame              2 0.0004092 0.17388 -1223.5
## - stab.glu:bp.1s     1 0.0055116 0.17980 -1223.3
## - hip:time.ppn       1 0.0068183 0.18110 -1222.0
## - weight:bp.1s       1 0.0080118 0.18230 -1220.8
## - chol               1 0.0093465 0.18363 -1219.5
## - hdl:ratio          1 0.0108517 0.18514 -1218.0
## - stab.glu:gender    1 0.0117801 0.18607 -1217.1
## - age:hip            1 0.0122417 0.18653 -1216.6
## - age:bp.1d          1 0.0131979 0.18748 -1215.7
## 
## Step:  AIC=-1227.33
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + age + gender + 
##     height + weight + bp.1s + bp.1d + waist + hip + time.ppn + 
##     stab.glu:gender + hdl:ratio + age:bp.1d + weight:bp.1s + 
##     age:hip + hip:time.ppn + gender:height + stab.glu:bp.1s + 
##     hdl:age + stab.glu:time.ppn
## 
##                     Df Sum of Sq     RSS     AIC
## + stab.glu:waist     1 0.0022290 0.16990 -1227.7
## <none>                           0.17213 -1227.3
## + age:waist          1 0.0018676 0.17026 -1227.3
## + height:hip         1 0.0018542 0.17027 -1227.3
## + stab.glu:hip       1 0.0016956 0.17043 -1227.1
## + stab.glu:weight    1 0.0016754 0.17045 -1227.1
## - stab.glu:time.ppn  1 0.0021611 0.17429 -1227.0
## + chol:time.ppn      1 0.0015415 0.17058 -1227.0
## + bp.1d:hip          1 0.0014502 0.17067 -1226.9
## + waist:time.ppn     1 0.0014456 0.17068 -1226.9
## + age:gender         1 0.0014274 0.17070 -1226.8
## + height:weight      1 0.0013607 0.17076 -1226.8
## + bp.1d:waist        1 0.0013531 0.17077 -1226.8
## + age:bp.1s          1 0.0012539 0.17087 -1226.7
## + bp.1s:waist        1 0.0011401 0.17098 -1226.5
## + weight:hip         1 0.0010618 0.17106 -1226.5
## + weight:time.ppn    1 0.0010271 0.17110 -1226.4
## + chol:weight        1 0.0010107 0.17111 -1226.4
## + hdl:hip            1 0.0009939 0.17113 -1226.4
## + hdl:gender         1 0.0009779 0.17115 -1226.4
## + ratio:gender       1 0.0009743 0.17115 -1226.4
## + chol:hip           1 0.0008378 0.17129 -1226.2
## + height:waist       1 0.0008278 0.17130 -1226.2
## + weight:waist       1 0.0007979 0.17133 -1226.2
## + weight:bp.1d       1 0.0007312 0.17139 -1226.1
## + ratio:bp.1d        1 0.0007065 0.17142 -1226.1
## + bp.1s:hip          1 0.0006258 0.17150 -1226.0
## + chol:hdl           1 0.0005888 0.17154 -1226.0
## + hdl:weight         1 0.0005737 0.17155 -1225.9
## + hdl:bp.1d          1 0.0005482 0.17158 -1225.9
## + ratio:bp.1s        1 0.0005439 0.17158 -1225.9
## + gender:waist       1 0.0005365 0.17159 -1225.9
## + height:bp.1s       1 0.0004876 0.17164 -1225.8
## + gender:hip         1 0.0004401 0.17169 -1225.8
## + waist:hip          1 0.0003880 0.17174 -1225.7
## + bp.1s:bp.1d        1 0.0003524 0.17177 -1225.7
## + gender:bp.1s       1 0.0003411 0.17178 -1225.7
## + ratio:waist        1 0.0003267 0.17180 -1225.7
## + chol:waist         1 0.0003231 0.17180 -1225.7
## + age:height         1 0.0003175 0.17181 -1225.7
## + gender:time.ppn    1 0.0002849 0.17184 -1225.6
## + age:weight         1 0.0002774 0.17185 -1225.6
## + stab.glu:age       1 0.0001788 0.17195 -1225.5
## + hdl:bp.1s          1 0.0001738 0.17195 -1225.5
## + bp.1s:time.ppn     1 0.0001646 0.17196 -1225.5
## + chol:ratio         1 0.0001632 0.17196 -1225.5
## + height:time.ppn    1 0.0001555 0.17197 -1225.5
## + hdl:time.ppn       1 0.0001323 0.17199 -1225.5
## + chol:stab.glu      1 0.0001275 0.17200 -1225.5
## + ratio:age          1 0.0000981 0.17203 -1225.4
## + hdl:waist          1 0.0000823 0.17204 -1225.4
## + location           1 0.0000702 0.17206 -1225.4
## + gender:weight      1 0.0000632 0.17206 -1225.4
## + ratio:weight       1 0.0000619 0.17206 -1225.4
## + stab.glu:bp.1d     1 0.0000529 0.17207 -1225.4
## + chol:age           1 0.0000456 0.17208 -1225.4
## + stab.glu:ratio     1 0.0000435 0.17208 -1225.4
## + ratio:time.ppn     1 0.0000423 0.17208 -1225.4
## + bp.1d:time.ppn     1 0.0000341 0.17209 -1225.4
## + chol:height        1 0.0000324 0.17209 -1225.4
## + hdl:height         1 0.0000227 0.17210 -1225.4
## + stab.glu:height    1 0.0000224 0.17210 -1225.3
## + chol:gender        1 0.0000200 0.17211 -1225.3
## + chol:bp.1s         1 0.0000165 0.17211 -1225.3
## + ratio:hip          1 0.0000142 0.17211 -1225.3
## + height:bp.1d       1 0.0000103 0.17211 -1225.3
## + stab.glu:hdl       1 0.0000033 0.17212 -1225.3
## + gender:bp.1d       1 0.0000006 0.17212 -1225.3
## + chol:bp.1d         1 0.0000003 0.17212 -1225.3
## + ratio:height       1 0.0000001 0.17213 -1225.3
## + age:time.ppn       1 0.0000000 0.17213 -1225.3
## - hdl:age            1 0.0038948 0.17602 -1225.2
## - waist              1 0.0045931 0.17672 -1224.5
## - gender:height      1 0.0047264 0.17685 -1224.4
## + frame              2 0.0002903 0.17183 -1223.6
## - stab.glu:bp.1s     1 0.0062913 0.17842 -1222.8
## - hip:time.ppn       1 0.0065331 0.17866 -1222.5
## - weight:bp.1s       1 0.0075630 0.17969 -1221.5
## - chol               1 0.0093540 0.18148 -1219.7
## - age:hip            1 0.0105668 0.18269 -1218.4
## - hdl:ratio          1 0.0110341 0.18316 -1218.0
## - stab.glu:gender    1 0.0117465 0.18387 -1217.2
## - age:bp.1d          1 0.0133598 0.18549 -1215.7
## 
## Step:  AIC=-1227.72
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + age + gender + 
##     height + weight + bp.1s + bp.1d + waist + hip + time.ppn + 
##     stab.glu:gender + hdl:ratio + age:bp.1d + weight:bp.1s + 
##     age:hip + hip:time.ppn + gender:height + stab.glu:bp.1s + 
##     hdl:age + stab.glu:time.ppn + stab.glu:waist
## 
##                     Df Sum of Sq     RSS     AIC
## + age:waist          1 0.0019695 0.16793 -1227.8
## <none>                           0.16990 -1227.7
## + chol:time.ppn      1 0.0016905 0.16820 -1227.5
## + hdl:weight         1 0.0016884 0.16821 -1227.5
## + hdl:hip            1 0.0016113 0.16828 -1227.5
## - stab.glu:waist     1 0.0022290 0.17213 -1227.3
## + age:bp.1s          1 0.0013785 0.16852 -1227.2
## + chol:weight        1 0.0013520 0.16854 -1227.2
## + bp.1s:waist        1 0.0012650 0.16863 -1227.1
## + age:gender         1 0.0012251 0.16867 -1227.0
## + height:hip         1 0.0012242 0.16867 -1227.0
## + waist:time.ppn     1 0.0011228 0.16877 -1226.9
## + bp.1d:waist        1 0.0011071 0.16879 -1226.9
## + bp.1d:hip          1 0.0009987 0.16890 -1226.8
## + chol:hdl           1 0.0009196 0.16898 -1226.7
## + chol:hip           1 0.0007971 0.16910 -1226.6
## + ratio:gender       1 0.0007641 0.16913 -1226.5
## + bp.1s:hip          1 0.0007475 0.16915 -1226.5
## + stab.glu:age       1 0.0007430 0.16915 -1226.5
## + hdl:gender         1 0.0007293 0.16917 -1226.5
## + weight:hip         1 0.0007172 0.16918 -1226.5
## - stab.glu:time.ppn  1 0.0031083 0.17300 -1226.4
## + height:weight      1 0.0006235 0.16927 -1226.4
## + bp.1s:bp.1d        1 0.0005652 0.16933 -1226.3
## + hdl:waist          1 0.0005057 0.16939 -1226.3
## + chol:ratio         1 0.0004611 0.16944 -1226.2
## + gender:bp.1s       1 0.0004566 0.16944 -1226.2
## + weight:bp.1d       1 0.0004490 0.16945 -1226.2
## + weight:time.ppn    1 0.0004125 0.16948 -1226.2
## + height:bp.1s       1 0.0003936 0.16950 -1226.1
## + ratio:bp.1d        1 0.0003867 0.16951 -1226.1
## + chol:waist         1 0.0003856 0.16951 -1226.1
## + hdl:bp.1d          1 0.0003686 0.16953 -1226.1
## + ratio:bp.1s        1 0.0003445 0.16955 -1226.1
## + height:waist       1 0.0003045 0.16959 -1226.0
## + chol:stab.glu      1 0.0002458 0.16965 -1226.0
## + hdl:time.ppn       1 0.0002292 0.16967 -1226.0
## + age:height         1 0.0002040 0.16969 -1225.9
## + gender:hip         1 0.0002015 0.16969 -1225.9
## + ratio:hip          1 0.0001855 0.16971 -1225.9
## + location           1 0.0001804 0.16972 -1225.9
## + gender:waist       1 0.0001732 0.16972 -1225.9
## + ratio:age          1 0.0001592 0.16974 -1225.9
## + waist:hip          1 0.0001513 0.16974 -1225.9
## + gender:time.ppn    1 0.0001408 0.16975 -1225.9
## + height:time.ppn    1 0.0001345 0.16976 -1225.9
## + bp.1s:time.ppn     1 0.0001245 0.16977 -1225.8
## + chol:age           1 0.0001025 0.16979 -1225.8
## + age:weight         1 0.0001019 0.16979 -1225.8
## + chol:height        1 0.0000935 0.16980 -1225.8
## + weight:waist       1 0.0000912 0.16981 -1225.8
## + hdl:bp.1s          1 0.0000900 0.16981 -1225.8
## + ratio:weight       1 0.0000843 0.16981 -1225.8
## + stab.glu:ratio     1 0.0000644 0.16983 -1225.8
## + stab.glu:bp.1d     1 0.0000403 0.16986 -1225.8
## + height:bp.1d       1 0.0000321 0.16986 -1225.8
## + hdl:height         1 0.0000284 0.16987 -1225.8
## + chol:bp.1s         1 0.0000262 0.16987 -1225.7
## + stab.glu:weight    1 0.0000148 0.16988 -1225.7
## + stab.glu:height    1 0.0000136 0.16988 -1225.7
## + gender:weight      1 0.0000116 0.16988 -1225.7
## + ratio:time.ppn     1 0.0000097 0.16989 -1225.7
## + ratio:waist        1 0.0000081 0.16989 -1225.7
## + bp.1d:time.ppn     1 0.0000077 0.16989 -1225.7
## + chol:bp.1d         1 0.0000074 0.16989 -1225.7
## + ratio:height       1 0.0000027 0.16989 -1225.7
## + stab.glu:hdl       1 0.0000013 0.16989 -1225.7
## + age:time.ppn       1 0.0000013 0.16989 -1225.7
## + chol:gender        1 0.0000007 0.16989 -1225.7
## + gender:bp.1d       1 0.0000004 0.16989 -1225.7
## + stab.glu:hip       1 0.0000003 0.16989 -1225.7
## - hdl:age            1 0.0038163 0.17371 -1225.7
## - gender:height      1 0.0043216 0.17422 -1225.1
## + frame              2 0.0001142 0.16978 -1223.8
## - weight:bp.1s       1 0.0068809 0.17678 -1222.5
## - hip:time.ppn       1 0.0073589 0.17725 -1222.0
## - stab.glu:bp.1s     1 0.0079419 0.17784 -1221.4
## - chol               1 0.0099718 0.17987 -1219.3
## - hdl:ratio          1 0.0113221 0.18122 -1217.9
## - age:hip            1 0.0116321 0.18153 -1217.6
## - stab.glu:gender    1 0.0117494 0.18165 -1217.5
## - age:bp.1d          1 0.0126181 0.18251 -1216.6
## 
## Step:  AIC=-1227.85
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + age + gender + 
##     height + weight + bp.1s + bp.1d + waist + hip + time.ppn + 
##     stab.glu:gender + hdl:ratio + age:bp.1d + weight:bp.1s + 
##     age:hip + hip:time.ppn + gender:height + stab.glu:bp.1s + 
##     hdl:age + stab.glu:time.ppn + stab.glu:waist + age:waist
## 
##                     Df Sum of Sq     RSS     AIC
## + chol:time.ppn      1 0.0021055 0.16582 -1228.2
## + waist:time.ppn     1 0.0018977 0.16603 -1227.9
## <none>                           0.16793 -1227.8
## - age:waist          1 0.0019695 0.16990 -1227.7
## + height:hip         1 0.0016640 0.16626 -1227.7
## + age:bp.1s          1 0.0014759 0.16645 -1227.5
## + hdl:weight         1 0.0014444 0.16648 -1227.4
## + hdl:hip            1 0.0013704 0.16656 -1227.3
## - stab.glu:waist     1 0.0023308 0.17026 -1227.3
## + chol:weight        1 0.0011322 0.16679 -1227.1
## + height:weight      1 0.0011067 0.16682 -1227.1
## + bp.1s:hip          1 0.0010010 0.16692 -1226.9
## + weight:hip         1 0.0009764 0.16695 -1226.9
## + bp.1d:waist        1 0.0009462 0.16698 -1226.9
## + chol:hip           1 0.0008692 0.16706 -1226.8
## + stab.glu:age       1 0.0008643 0.16706 -1226.8
## + bp.1s:bp.1d        1 0.0008041 0.16712 -1226.7
## + hdl:time.ppn       1 0.0008022 0.16712 -1226.7
## + bp.1d:hip          1 0.0007379 0.16719 -1226.7
## - stab.glu:time.ppn  1 0.0029591 0.17089 -1226.7
## - hdl:age            1 0.0030149 0.17094 -1226.6
## + hdl:gender         1 0.0005601 0.16737 -1226.5
## + chol:hdl           1 0.0005598 0.16737 -1226.5
## + weight:time.ppn    1 0.0005572 0.16737 -1226.5
## + ratio:gender       1 0.0005152 0.16741 -1226.4
## + height:waist       1 0.0004914 0.16744 -1226.4
## + age:gender         1 0.0004727 0.16745 -1226.4
## + gender:bp.1s       1 0.0003816 0.16754 -1226.3
## + ratio:bp.1s        1 0.0003691 0.16756 -1226.2
## + bp.1s:waist        1 0.0003666 0.16756 -1226.2
## + height:bp.1s       1 0.0003312 0.16759 -1226.2
## + waist:hip          1 0.0003236 0.16760 -1226.2
## + hdl:bp.1d          1 0.0002903 0.16764 -1226.2
## + ratio:bp.1d        1 0.0002855 0.16764 -1226.2
## + hdl:waist          1 0.0002847 0.16764 -1226.2
## + chol:ratio         1 0.0002729 0.16765 -1226.2
## + hdl:bp.1s          1 0.0002462 0.16768 -1226.1
## + weight:waist       1 0.0002046 0.16772 -1226.1
## + gender:hip         1 0.0001956 0.16773 -1226.1
## + location           1 0.0001930 0.16773 -1226.1
## + height:bp.1d       1 0.0001890 0.16774 -1226.1
## + age:weight         1 0.0001877 0.16774 -1226.0
## + chol:waist         1 0.0001751 0.16775 -1226.0
## + chol:stab.glu      1 0.0001466 0.16778 -1226.0
## + weight:bp.1d       1 0.0001310 0.16779 -1226.0
## + gender:waist       1 0.0001155 0.16781 -1226.0
## + gender:time.ppn    1 0.0001116 0.16781 -1226.0
## + ratio:age          1 0.0001063 0.16782 -1226.0
## + ratio:hip          1 0.0001043 0.16782 -1226.0
## + height:time.ppn    1 0.0001018 0.16782 -1226.0
## + ratio:weight       1 0.0000897 0.16784 -1226.0
## + bp.1s:time.ppn     1 0.0000805 0.16785 -1225.9
## + stab.glu:ratio     1 0.0000572 0.16787 -1225.9
## + stab.glu:hdl       1 0.0000546 0.16787 -1225.9
## + hdl:height         1 0.0000518 0.16787 -1225.9
## + stab.glu:hip       1 0.0000506 0.16788 -1225.9
## + age:time.ppn       1 0.0000488 0.16788 -1225.9
## + ratio:height       1 0.0000415 0.16789 -1225.9
## + gender:bp.1d       1 0.0000356 0.16789 -1225.9
## + age:height         1 0.0000351 0.16789 -1225.9
## + ratio:time.ppn     1 0.0000296 0.16790 -1225.9
## + chol:age           1 0.0000282 0.16790 -1225.9
## + chol:height        1 0.0000254 0.16790 -1225.9
## + stab.glu:bp.1d     1 0.0000247 0.16790 -1225.9
## + stab.glu:height    1 0.0000150 0.16791 -1225.9
## + chol:bp.1d         1 0.0000066 0.16792 -1225.9
## + chol:gender        1 0.0000043 0.16792 -1225.8
## + bp.1d:time.ppn     1 0.0000031 0.16792 -1225.8
## + gender:weight      1 0.0000008 0.16792 -1225.8
## + ratio:waist        1 0.0000004 0.16793 -1225.8
## + chol:bp.1s         1 0.0000003 0.16793 -1225.8
## + stab.glu:weight    1 0.0000001 0.16793 -1225.8
## - gender:height      1 0.0043405 0.17227 -1225.2
## + frame              2 0.0000443 0.16788 -1223.9
## - weight:bp.1s       1 0.0057009 0.17363 -1223.7
## - stab.glu:bp.1s     1 0.0082894 0.17622 -1221.0
## - hip:time.ppn       1 0.0084288 0.17636 -1220.9
## - chol               1 0.0102824 0.17821 -1219.0
## - age:hip            1 0.0103722 0.17830 -1218.9
## - hdl:ratio          1 0.0114362 0.17936 -1217.8
## - age:bp.1d          1 0.0116848 0.17961 -1217.5
## - stab.glu:gender    1 0.0123026 0.18023 -1216.9
## 
## Step:  AIC=-1228.16
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + age + gender + 
##     height + weight + bp.1s + bp.1d + waist + hip + time.ppn + 
##     stab.glu:gender + hdl:ratio + age:bp.1d + weight:bp.1s + 
##     age:hip + hip:time.ppn + gender:height + stab.glu:bp.1s + 
##     hdl:age + stab.glu:time.ppn + stab.glu:waist + age:waist + 
##     chol:time.ppn
## 
##                     Df Sum of Sq     RSS     AIC
## + hdl:weight         1 0.0018865 0.16393 -1228.2
## <none>                           0.16582 -1228.2
## + waist:time.ppn     1 0.0017161 0.16411 -1228.1
## + chol:weight        1 0.0016244 0.16420 -1228.0
## - chol:time.ppn      1 0.0021055 0.16793 -1227.8
## + height:hip         1 0.0015115 0.16431 -1227.8
## + hdl:hip            1 0.0013570 0.16446 -1227.7
## + weight:hip         1 0.0012902 0.16453 -1227.6
## - age:waist          1 0.0023844 0.16820 -1227.5
## + bp.1d:waist        1 0.0011404 0.16468 -1227.4
## - stab.glu:waist     1 0.0025133 0.16833 -1227.4
## + age:bp.1s          1 0.0010712 0.16475 -1227.3
## + chol:hip           1 0.0010690 0.16475 -1227.3
## + weight:time.ppn    1 0.0010356 0.16478 -1227.3
## + stab.glu:age       1 0.0010260 0.16479 -1227.3
## + chol:hdl           1 0.0009252 0.16490 -1227.2
## + bp.1d:hip          1 0.0009153 0.16491 -1227.2
## + height:weight      1 0.0008347 0.16499 -1227.1
## - hdl:age            1 0.0028167 0.16864 -1227.1
## + age:gender         1 0.0008101 0.16501 -1227.1
## + bp.1s:hip          1 0.0007968 0.16502 -1227.0
## + hdl:bp.1d          1 0.0006873 0.16513 -1226.9
## + ratio:bp.1d        1 0.0006483 0.16517 -1226.9
## + bp.1s:bp.1d        1 0.0006155 0.16520 -1226.8
## + hdl:waist          1 0.0005429 0.16528 -1226.8
## + height:time.ppn    1 0.0005046 0.16532 -1226.7
## + waist:hip          1 0.0004737 0.16535 -1226.7
## + height:waist       1 0.0004412 0.16538 -1226.7
## + ratio:time.ppn     1 0.0004351 0.16539 -1226.6
## + chol:ratio         1 0.0004344 0.16539 -1226.6
## + ratio:bp.1s        1 0.0004157 0.16540 -1226.6
## + location           1 0.0003812 0.16544 -1226.6
## + chol:waist         1 0.0003475 0.16547 -1226.5
## + bp.1s:time.ppn     1 0.0003382 0.16548 -1226.5
## + gender:bp.1s       1 0.0003341 0.16549 -1226.5
## + weight:bp.1d       1 0.0003063 0.16551 -1226.5
## + gender:time.ppn    1 0.0002990 0.16552 -1226.5
## + height:bp.1s       1 0.0002936 0.16553 -1226.5
## + ratio:gender       1 0.0002727 0.16555 -1226.5
## + bp.1s:waist        1 0.0002656 0.16556 -1226.5
## + weight:waist       1 0.0002601 0.16556 -1226.5
## + ratio:age          1 0.0002525 0.16557 -1226.4
## + hdl:time.ppn       1 0.0002436 0.16558 -1226.4
## + hdl:gender         1 0.0002392 0.16558 -1226.4
## + hdl:bp.1s          1 0.0002189 0.16560 -1226.4
## + chol:stab.glu      1 0.0001855 0.16564 -1226.4
## + age:weight         1 0.0001699 0.16565 -1226.3
## + ratio:height       1 0.0001440 0.16568 -1226.3
## + hdl:height         1 0.0001266 0.16569 -1226.3
## + gender:weight      1 0.0001035 0.16572 -1226.3
## + age:height         1 0.0000990 0.16572 -1226.3
## + ratio:weight       1 0.0000952 0.16573 -1226.3
## + chol:age           1 0.0000810 0.16574 -1226.2
## + height:bp.1d       1 0.0000751 0.16575 -1226.2
## + stab.glu:height    1 0.0000736 0.16575 -1226.2
## + stab.glu:hdl       1 0.0000685 0.16575 -1226.2
## + ratio:hip          1 0.0000648 0.16576 -1226.2
## + bp.1d:time.ppn     1 0.0000500 0.16577 -1226.2
## + gender:hip         1 0.0000333 0.16579 -1226.2
## + gender:waist       1 0.0000236 0.16580 -1226.2
## + stab.glu:ratio     1 0.0000168 0.16580 -1226.2
## + chol:height        1 0.0000125 0.16581 -1226.2
## + stab.glu:hip       1 0.0000100 0.16581 -1226.2
## + age:time.ppn       1 0.0000063 0.16581 -1226.2
## + chol:bp.1d         1 0.0000034 0.16582 -1226.2
## + chol:bp.1s         1 0.0000033 0.16582 -1226.2
## + stab.glu:bp.1d     1 0.0000019 0.16582 -1226.2
## + stab.glu:weight    1 0.0000016 0.16582 -1226.2
## + ratio:waist        1 0.0000007 0.16582 -1226.2
## + gender:bp.1d       1 0.0000000 0.16582 -1226.2
## + chol:gender        1 0.0000000 0.16582 -1226.2
## - stab.glu:time.ppn  1 0.0048355 0.17066 -1224.9
## - gender:height      1 0.0051301 0.17095 -1224.6
## + frame              2 0.0000492 0.16577 -1224.2
## - weight:bp.1s       1 0.0057938 0.17161 -1223.9
## - hip:time.ppn       1 0.0083947 0.17422 -1221.1
## - stab.glu:bp.1s     1 0.0090807 0.17490 -1220.4
## - age:hip            1 0.0111657 0.17699 -1218.2
## - hdl:ratio          1 0.0119910 0.17781 -1217.4
## - age:bp.1d          1 0.0124276 0.17825 -1216.9
## - stab.glu:gender    1 0.0131584 0.17898 -1216.2
## 
## Step:  AIC=-1228.25
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + age + gender + 
##     height + weight + bp.1s + bp.1d + waist + hip + time.ppn + 
##     stab.glu:gender + hdl:ratio + age:bp.1d + weight:bp.1s + 
##     age:hip + hip:time.ppn + gender:height + stab.glu:bp.1s + 
##     hdl:age + stab.glu:time.ppn + stab.glu:waist + age:waist + 
##     chol:time.ppn + hdl:weight
## 
##                     Df Sum of Sq     RSS     AIC
## - hdl:age            1 0.0015606 0.16550 -1228.5
## + weight:hip         1 0.0019462 0.16199 -1228.4
## + bp.1d:waist        1 0.0018906 0.16204 -1228.4
## + waist:time.ppn     1 0.0018326 0.16210 -1228.3
## <none>                           0.16393 -1228.2
## - hdl:weight         1 0.0018865 0.16582 -1228.2
## - age:waist          1 0.0021270 0.16606 -1227.9
## + stab.glu:age       1 0.0013702 0.16256 -1227.8
## + ratio:weight       1 0.0013453 0.16259 -1227.8
## + age:gender         1 0.0012741 0.16266 -1227.7
## + height:hip         1 0.0012022 0.16273 -1227.6
## + bp.1d:hip          1 0.0011778 0.16276 -1227.6
## + ratio:waist        1 0.0010548 0.16288 -1227.4
## - chol:time.ppn      1 0.0025476 0.16648 -1227.4
## + chol:weight        1 0.0010232 0.16291 -1227.4
## + age:bp.1s          1 0.0009145 0.16302 -1227.3
## + waist:hip          1 0.0008770 0.16306 -1227.2
## + weight:waist       1 0.0008694 0.16306 -1227.2
## + chol:hip           1 0.0008360 0.16310 -1227.2
## + weight:time.ppn    1 0.0007782 0.16316 -1227.1
## + bp.1s:hip          1 0.0007731 0.16316 -1227.1
## + weight:bp.1d       1 0.0006654 0.16327 -1227.0
## + height:weight      1 0.0006602 0.16327 -1227.0
## + bp.1s:bp.1d        1 0.0006399 0.16329 -1227.0
## + hdl:waist          1 0.0006146 0.16332 -1226.9
## + bp.1s:time.ppn     1 0.0005913 0.16334 -1226.9
## + chol:hdl           1 0.0005832 0.16335 -1226.9
## + ratio:hip          1 0.0005771 0.16336 -1226.9
## + height:waist       1 0.0005707 0.16336 -1226.9
## + location           1 0.0005564 0.16338 -1226.9
## + ratio:time.ppn     1 0.0005211 0.16341 -1226.8
## + ratio:bp.1d        1 0.0005057 0.16343 -1226.8
## + hdl:gender         1 0.0004524 0.16348 -1226.8
## + hdl:bp.1d          1 0.0004162 0.16352 -1226.7
## + height:time.ppn    1 0.0004036 0.16353 -1226.7
## + ratio:gender       1 0.0003777 0.16356 -1226.7
## + gender:bp.1s       1 0.0003136 0.16362 -1226.6
## + age:height         1 0.0003004 0.16363 -1226.6
## + ratio:bp.1s        1 0.0002800 0.16365 -1226.6
## + hdl:time.ppn       1 0.0002754 0.16366 -1226.6
## + height:bp.1s       1 0.0002238 0.16371 -1226.5
## + ratio:age          1 0.0002088 0.16373 -1226.5
## + stab.glu:height    1 0.0002078 0.16373 -1226.5
## + chol:ratio         1 0.0001965 0.16374 -1226.5
## + stab.glu:weight    1 0.0001836 0.16375 -1226.5
## + chol:stab.glu      1 0.0001735 0.16376 -1226.5
## + bp.1d:time.ppn     1 0.0001627 0.16377 -1226.4
## + gender:time.ppn    1 0.0001432 0.16379 -1226.4
## + bp.1s:waist        1 0.0001381 0.16380 -1226.4
## + hdl:bp.1s          1 0.0001365 0.16380 -1226.4
## + chol:waist         1 0.0001189 0.16381 -1226.4
## + stab.glu:hdl       1 0.0001044 0.16383 -1226.4
## + gender:waist       1 0.0000900 0.16384 -1226.3
## + gender:weight      1 0.0000665 0.16387 -1226.3
## + height:bp.1d       1 0.0000645 0.16387 -1226.3
## + ratio:height       1 0.0000448 0.16389 -1226.3
## + gender:hip         1 0.0000346 0.16390 -1226.3
## + hdl:hip            1 0.0000341 0.16390 -1226.3
## + chol:gender        1 0.0000306 0.16390 -1226.3
## + chol:age           1 0.0000278 0.16391 -1226.3
## + hdl:height         1 0.0000211 0.16391 -1226.3
## + stab.glu:ratio     1 0.0000170 0.16392 -1226.3
## + stab.glu:hip       1 0.0000105 0.16392 -1226.3
## + chol:bp.1d         1 0.0000085 0.16393 -1226.3
## + age:time.ppn       1 0.0000055 0.16393 -1226.3
## + stab.glu:bp.1d     1 0.0000045 0.16393 -1226.3
## + chol:bp.1s         1 0.0000036 0.16393 -1226.3
## + gender:bp.1d       1 0.0000033 0.16393 -1226.3
## + age:weight         1 0.0000006 0.16393 -1226.2
## + chol:height        1 0.0000004 0.16393 -1226.2
## - stab.glu:waist     1 0.0037778 0.16771 -1226.1
## - weight:bp.1s       1 0.0042446 0.16818 -1225.6
## - stab.glu:time.ppn  1 0.0050091 0.16894 -1224.7
## + frame              2 0.0000496 0.16389 -1224.3
## - gender:height      1 0.0054460 0.16938 -1224.3
## - hip:time.ppn       1 0.0081999 0.17213 -1221.3
## - stab.glu:bp.1s     1 0.0101557 0.17409 -1219.2
## - age:hip            1 0.0108045 0.17474 -1218.6
## - stab.glu:gender    1 0.0114650 0.17540 -1217.9
## - hdl:ratio          1 0.0130139 0.17695 -1216.3
## - age:bp.1d          1 0.0132352 0.17717 -1216.0
## 
## Step:  AIC=-1228.52
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + age + gender + 
##     height + weight + bp.1s + bp.1d + waist + hip + time.ppn + 
##     stab.glu:gender + hdl:ratio + age:bp.1d + weight:bp.1s + 
##     age:hip + hip:time.ppn + gender:height + stab.glu:bp.1s + 
##     stab.glu:time.ppn + stab.glu:waist + age:waist + chol:time.ppn + 
##     hdl:weight
## 
##                     Df Sum of Sq     RSS     AIC
## + waist:time.ppn     1 0.0026697 0.16282 -1229.5
## + bp.1d:waist        1 0.0023635 0.16313 -1229.2
## + ratio:waist        1 0.0020877 0.16341 -1228.8
## + weight:hip         1 0.0019862 0.16351 -1228.7
## + hdl:waist          1 0.0018415 0.16365 -1228.6
## + age:gender         1 0.0018222 0.16367 -1228.5
## <none>                           0.16550 -1228.5
## + ratio:weight       1 0.0017473 0.16375 -1228.5
## + hdl:age            1 0.0015606 0.16393 -1228.2
## + chol:hdl           1 0.0014765 0.16402 -1228.2
## + chol:weight        1 0.0013472 0.16415 -1228.0
## + bp.1d:hip          1 0.0012991 0.16420 -1228.0
## + ratio:hip          1 0.0012565 0.16424 -1227.9
## + stab.glu:age       1 0.0011777 0.16432 -1227.8
## + waist:hip          1 0.0010118 0.16448 -1227.6
## - age:waist          1 0.0026357 0.16813 -1227.6
## + weight:bp.1d       1 0.0009951 0.16450 -1227.6
## + chol:hip           1 0.0009525 0.16454 -1227.6
## + height:hip         1 0.0008997 0.16459 -1227.5
## + weight:waist       1 0.0008693 0.16463 -1227.5
## - chol:time.ppn      1 0.0028368 0.16833 -1227.4
## + weight:time.ppn    1 0.0007318 0.16476 -1227.3
## + bp.1s:bp.1d        1 0.0007094 0.16479 -1227.3
## + age:height         1 0.0006443 0.16485 -1227.2
## + ratio:bp.1d        1 0.0005509 0.16494 -1227.1
## + height:waist       1 0.0005150 0.16498 -1227.1
## - hdl:weight         1 0.0031426 0.16864 -1227.1
## + bp.1s:hip          1 0.0004819 0.16501 -1227.0
## + ratio:time.ppn     1 0.0004780 0.16502 -1227.0
## + bp.1s:time.ppn     1 0.0004716 0.16502 -1227.0
## + height:time.ppn    1 0.0004059 0.16509 -1227.0
## + ratio:age          1 0.0003952 0.16510 -1227.0
## + chol:ratio         1 0.0003631 0.16513 -1226.9
## + stab.glu:hdl       1 0.0003448 0.16515 -1226.9
## + height:weight      1 0.0003359 0.16516 -1226.9
## + location           1 0.0003326 0.16516 -1226.9
## + age:bp.1s          1 0.0003316 0.16516 -1226.9
## + hdl:bp.1d          1 0.0003311 0.16516 -1226.9
## + hdl:height         1 0.0002970 0.16520 -1226.8
## + hdl:time.ppn       1 0.0002480 0.16525 -1226.8
## + gender:time.ppn    1 0.0002335 0.16526 -1226.8
## + ratio:height       1 0.0002265 0.16527 -1226.8
## + chol:age           1 0.0002115 0.16528 -1226.8
## + hdl:gender         1 0.0002078 0.16529 -1226.8
## + gender:bp.1s       1 0.0001979 0.16530 -1226.7
## + stab.glu:weight    1 0.0001940 0.16530 -1226.7
## + ratio:gender       1 0.0001918 0.16530 -1226.7
## + chol:waist         1 0.0001687 0.16533 -1226.7
## + height:bp.1s       1 0.0001567 0.16534 -1226.7
## + chol:stab.glu      1 0.0001551 0.16534 -1226.7
## + age:weight         1 0.0001401 0.16536 -1226.7
## + hdl:bp.1s          1 0.0001376 0.16536 -1226.7
## + bp.1s:waist        1 0.0001244 0.16537 -1226.7
## + hdl:hip            1 0.0001151 0.16538 -1226.7
## + gender:waist       1 0.0001086 0.16539 -1226.6
## + stab.glu:height    1 0.0001075 0.16539 -1226.6
## + gender:weight      1 0.0000954 0.16540 -1226.6
## + chol:bp.1s         1 0.0000885 0.16541 -1226.6
## + bp.1d:time.ppn     1 0.0000736 0.16542 -1226.6
## + stab.glu:hip       1 0.0000675 0.16543 -1226.6
## + chol:gender        1 0.0000432 0.16545 -1226.6
## + gender:bp.1d       1 0.0000286 0.16547 -1226.5
## + chol:bp.1d         1 0.0000207 0.16547 -1226.5
## + gender:hip         1 0.0000187 0.16548 -1226.5
## + age:time.ppn       1 0.0000124 0.16548 -1226.5
## + height:bp.1d       1 0.0000120 0.16548 -1226.5
## + stab.glu:ratio     1 0.0000044 0.16549 -1226.5
## + stab.glu:bp.1d     1 0.0000022 0.16549 -1226.5
## + ratio:bp.1s        1 0.0000004 0.16549 -1226.5
## + chol:height        1 0.0000001 0.16550 -1226.5
## - stab.glu:waist     1 0.0043402 0.16984 -1225.8
## - weight:bp.1s       1 0.0046889 0.17018 -1225.4
## - stab.glu:time.ppn  1 0.0048940 0.17039 -1225.2
## - gender:height      1 0.0049494 0.17044 -1225.1
## + frame              2 0.0000793 0.16542 -1224.6
## - hip:time.ppn       1 0.0079831 0.17348 -1221.9
## - stab.glu:bp.1s     1 0.0100263 0.17552 -1219.8
## - age:hip            1 0.0109306 0.17643 -1218.8
## - stab.glu:gender    1 0.0112016 0.17670 -1218.5
## - age:bp.1d          1 0.0127878 0.17828 -1216.9
## - hdl:ratio          1 0.0150028 0.18050 -1214.6
## 
## Step:  AIC=-1229.5
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + age + gender + 
##     height + weight + bp.1s + bp.1d + waist + hip + time.ppn + 
##     stab.glu:gender + hdl:ratio + age:bp.1d + weight:bp.1s + 
##     age:hip + hip:time.ppn + gender:height + stab.glu:bp.1s + 
##     stab.glu:time.ppn + stab.glu:waist + age:waist + chol:time.ppn + 
##     hdl:weight + waist:time.ppn
## 
##                     Df Sum of Sq     RSS     AIC
## + bp.1d:waist        1 0.0018013 0.16102 -1229.5
## <none>                           0.16282 -1229.5
## + weight:hip         1 0.0017082 0.16112 -1229.4
## + ratio:weight       1 0.0015527 0.16127 -1229.2
## + ratio:waist        1 0.0014735 0.16135 -1229.2
## + ratio:hip          1 0.0014272 0.16140 -1229.1
## + bp.1s:time.ppn     1 0.0013016 0.16152 -1229.0
## + age:gender         1 0.0012660 0.16156 -1228.9
## + chol:weight        1 0.0011348 0.16169 -1228.8
## + bp.1d:hip          1 0.0011104 0.16171 -1228.8
## + height:hip         1 0.0010918 0.16173 -1228.7
## - chol:time.ppn      1 0.0025063 0.16533 -1228.7
## + chol:hip           1 0.0009886 0.16184 -1228.6
## - waist:time.ppn     1 0.0026697 0.16550 -1228.5
## + hdl:waist          1 0.0008516 0.16197 -1228.5
## + stab.glu:age       1 0.0008070 0.16202 -1228.4
## + bp.1s:bp.1d        1 0.0007913 0.16203 -1228.4
## + chol:hdl           1 0.0007534 0.16207 -1228.3
## + hdl:age            1 0.0007235 0.16210 -1228.3
## - hdl:weight         1 0.0029021 0.16573 -1228.3
## + weight:bp.1d       1 0.0006764 0.16215 -1228.3
## + ratio:bp.1d        1 0.0006711 0.16215 -1228.2
## + waist:hip          1 0.0005961 0.16223 -1228.2
## + bp.1s:hip          1 0.0005915 0.16223 -1228.2
## + weight:waist       1 0.0005270 0.16230 -1228.1
## + age:time.ppn       1 0.0005030 0.16232 -1228.1
## + hdl:bp.1d          1 0.0004750 0.16235 -1228.0
## + height:time.ppn    1 0.0004738 0.16235 -1228.0
## + location           1 0.0004337 0.16239 -1228.0
## + age:bp.1s          1 0.0004310 0.16239 -1228.0
## + bp.1d:time.ppn     1 0.0004128 0.16241 -1228.0
## + height:weight      1 0.0004107 0.16241 -1228.0
## + age:height         1 0.0003809 0.16244 -1227.9
## + ratio:time.ppn     1 0.0003696 0.16246 -1227.9
## + height:waist       1 0.0003634 0.16246 -1227.9
## + gender:bp.1s       1 0.0002607 0.16256 -1227.8
## + ratio:height       1 0.0002384 0.16259 -1227.8
## + hdl:height         1 0.0002270 0.16260 -1227.8
## + chol:waist         1 0.0001976 0.16263 -1227.7
## + hdl:gender         1 0.0001801 0.16265 -1227.7
## + height:bp.1s       1 0.0001383 0.16269 -1227.7
## + gender:waist       1 0.0001377 0.16269 -1227.7
## + chol:ratio         1 0.0001346 0.16269 -1227.7
## + ratio:age          1 0.0001340 0.16269 -1227.7
## + ratio:gender       1 0.0001323 0.16269 -1227.6
## + chol:stab.glu      1 0.0001317 0.16269 -1227.6
## + hdl:time.ppn       1 0.0001315 0.16269 -1227.6
## + bp.1s:waist        1 0.0001262 0.16270 -1227.6
## + weight:time.ppn    1 0.0001216 0.16270 -1227.6
## + hdl:hip            1 0.0001180 0.16271 -1227.6
## - age:waist          1 0.0034852 0.16631 -1227.6
## + chol:age           1 0.0001000 0.16273 -1227.6
## + stab.glu:hdl       1 0.0000980 0.16273 -1227.6
## + ratio:bp.1s        1 0.0000763 0.16275 -1227.6
## + chol:gender        1 0.0000729 0.16275 -1227.6
## + gender:hip         1 0.0000662 0.16276 -1227.6
## + stab.glu:height    1 0.0000625 0.16276 -1227.6
## + gender:weight      1 0.0000504 0.16278 -1227.5
## + chol:bp.1s         1 0.0000471 0.16278 -1227.5
## + gender:bp.1d       1 0.0000391 0.16279 -1227.5
## + height:bp.1d       1 0.0000262 0.16280 -1227.5
## + age:weight         1 0.0000259 0.16280 -1227.5
## + chol:bp.1d         1 0.0000163 0.16281 -1227.5
## + stab.glu:hip       1 0.0000158 0.16281 -1227.5
## + stab.glu:ratio     1 0.0000080 0.16282 -1227.5
## + gender:time.ppn    1 0.0000043 0.16282 -1227.5
## - stab.glu:waist     1 0.0035949 0.16642 -1227.5
## + hdl:bp.1s          1 0.0000025 0.16282 -1227.5
## + stab.glu:weight    1 0.0000021 0.16282 -1227.5
## + stab.glu:bp.1d     1 0.0000007 0.16282 -1227.5
## + chol:height        1 0.0000002 0.16282 -1227.5
## - weight:bp.1s       1 0.0043757 0.16720 -1226.6
## - gender:height      1 0.0044211 0.16725 -1226.6
## + frame              2 0.0002158 0.16261 -1225.7
## - stab.glu:time.ppn  1 0.0064804 0.16931 -1224.3
## - hip:time.ppn       1 0.0088614 0.17169 -1221.8
## - stab.glu:bp.1s     1 0.0107669 0.17359 -1219.8
## - stab.glu:gender    1 0.0123763 0.17520 -1218.1
## - age:hip            1 0.0128004 0.17563 -1217.7
## - age:bp.1d          1 0.0137709 0.17660 -1216.6
## - hdl:ratio          1 0.0158629 0.17869 -1214.5
## 
## Step:  AIC=-1229.53
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + age + gender + 
##     height + weight + bp.1s + bp.1d + waist + hip + time.ppn + 
##     stab.glu:gender + hdl:ratio + age:bp.1d + weight:bp.1s + 
##     age:hip + hip:time.ppn + gender:height + stab.glu:bp.1s + 
##     stab.glu:time.ppn + stab.glu:waist + age:waist + chol:time.ppn + 
##     hdl:weight + waist:time.ppn + bp.1d:waist
## 
##                     Df Sum of Sq     RSS     AIC
## + weight:hip         1 0.0026296 0.15839 -1230.5
## + ratio:weight       1 0.0018275 0.15920 -1229.6
## + ratio:waist        1 0.0017639 0.15926 -1229.5
## <none>                           0.16102 -1229.5
## - bp.1d:waist        1 0.0018013 0.16282 -1229.5
## + ratio:hip          1 0.0017010 0.15932 -1229.5
## + bp.1s:hip          1 0.0015721 0.15945 -1229.3
## + chol:hip           1 0.0014769 0.15955 -1229.2
## - waist:time.ppn     1 0.0021074 0.16313 -1229.2
## + height:hip         1 0.0013823 0.15964 -1229.1
## + bp.1s:time.ppn     1 0.0013350 0.15969 -1229.0
## + chol:weight        1 0.0013032 0.15972 -1229.0
## + weight:waist       1 0.0011344 0.15989 -1228.8
## + height:time.ppn    1 0.0010114 0.16001 -1228.7
## + waist:hip          1 0.0009573 0.16007 -1228.6
## + stab.glu:age       1 0.0009275 0.16010 -1228.6
## + bp.1s:waist        1 0.0008906 0.16013 -1228.5
## + age:time.ppn       1 0.0007754 0.16025 -1228.4
## + age:gender         1 0.0006906 0.16033 -1228.3
## - chol:time.ppn      1 0.0028651 0.16389 -1228.3
## + height:weight      1 0.0006667 0.16036 -1228.3
## + gender:bp.1s       1 0.0006616 0.16036 -1228.3
## + bp.1s:bp.1d        1 0.0005862 0.16044 -1228.2
## + hdl:waist          1 0.0005839 0.16044 -1228.2
## - age:waist          1 0.0029620 0.16399 -1228.2
## + age:bp.1s          1 0.0005711 0.16045 -1228.2
## + hdl:age            1 0.0004953 0.16053 -1228.1
## + chol:waist         1 0.0004683 0.16056 -1228.1
## + chol:hdl           1 0.0004389 0.16059 -1228.0
## + height:waist       1 0.0004203 0.16060 -1228.0
## + ratio:time.ppn     1 0.0003610 0.16066 -1227.9
## + weight:bp.1d       1 0.0002863 0.16074 -1227.9
## + height:bp.1s       1 0.0002773 0.16075 -1227.8
## + location           1 0.0002748 0.16075 -1227.8
## + gender:waist       1 0.0002353 0.16079 -1227.8
## + ratio:height       1 0.0002312 0.16079 -1227.8
## + chol:gender        1 0.0002201 0.16080 -1227.8
## + ratio:bp.1d        1 0.0002143 0.16081 -1227.8
## + weight:time.ppn    1 0.0002117 0.16081 -1227.8
## + bp.1d:time.ppn     1 0.0002107 0.16081 -1227.8
## + gender:hip         1 0.0001903 0.16083 -1227.8
## + hdl:gender         1 0.0001776 0.16085 -1227.7
## + hdl:time.ppn       1 0.0001550 0.16087 -1227.7
## + age:height         1 0.0001507 0.16087 -1227.7
## + gender:bp.1d       1 0.0001152 0.16091 -1227.7
## + hdl:bp.1d          1 0.0001114 0.16091 -1227.7
## + stab.glu:height    1 0.0001005 0.16092 -1227.7
## + stab.glu:hdl       1 0.0000973 0.16093 -1227.6
## + chol:stab.glu      1 0.0000824 0.16094 -1227.6
## + chol:age           1 0.0000796 0.16094 -1227.6
## + age:weight         1 0.0000734 0.16095 -1227.6
## + hdl:hip            1 0.0000717 0.16095 -1227.6
## + ratio:age          1 0.0000656 0.16096 -1227.6
## + hdl:height         1 0.0000655 0.16096 -1227.6
## + ratio:bp.1s        1 0.0000627 0.16096 -1227.6
## + ratio:gender       1 0.0000616 0.16096 -1227.6
## + chol:ratio         1 0.0000574 0.16097 -1227.6
## + chol:height        1 0.0000328 0.16099 -1227.6
## + stab.glu:ratio     1 0.0000253 0.16100 -1227.6
## + stab.glu:bp.1d     1 0.0000224 0.16100 -1227.6
## + height:bp.1d       1 0.0000216 0.16100 -1227.6
## + gender:time.ppn    1 0.0000214 0.16100 -1227.6
## + chol:bp.1s         1 0.0000105 0.16101 -1227.5
## + stab.glu:hip       1 0.0000074 0.16102 -1227.5
## + gender:weight      1 0.0000020 0.16102 -1227.5
## + stab.glu:weight    1 0.0000020 0.16102 -1227.5
## + hdl:bp.1s          1 0.0000015 0.16102 -1227.5
## - stab.glu:waist     1 0.0035579 0.16458 -1227.5
## + chol:bp.1d         1 0.0000002 0.16102 -1227.5
## + bp.1d:hip          1 0.0000001 0.16102 -1227.5
## - hdl:weight         1 0.0036653 0.16469 -1227.4
## + frame              2 0.0003534 0.16067 -1225.9
## - gender:height      1 0.0057102 0.16673 -1225.2
## - weight:bp.1s       1 0.0061742 0.16720 -1224.7
## - stab.glu:time.ppn  1 0.0067609 0.16778 -1224.0
## - hip:time.ppn       1 0.0068957 0.16792 -1223.9
## - stab.glu:bp.1s     1 0.0099463 0.17097 -1220.6
## - stab.glu:gender    1 0.0124566 0.17348 -1217.9
## - age:hip            1 0.0132369 0.17426 -1217.1
## - age:bp.1d          1 0.0152602 0.17628 -1215.0
## - hdl:ratio          1 0.0158709 0.17689 -1214.3
## 
## Step:  AIC=-1230.54
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + age + gender + 
##     height + weight + bp.1s + bp.1d + waist + hip + time.ppn + 
##     stab.glu:gender + hdl:ratio + age:bp.1d + weight:bp.1s + 
##     age:hip + hip:time.ppn + gender:height + stab.glu:bp.1s + 
##     stab.glu:time.ppn + stab.glu:waist + age:waist + chol:time.ppn + 
##     hdl:weight + waist:time.ppn + bp.1d:waist + weight:hip
## 
##                     Df Sum of Sq     RSS     AIC
## - waist:time.ppn     1 0.0016817 0.16008 -1230.6
## <none>                           0.15839 -1230.5
## + bp.1s:hip          1 0.0015348 0.15686 -1230.3
## + height:time.ppn    1 0.0014477 0.15695 -1230.2
## + bp.1s:time.ppn     1 0.0013414 0.15705 -1230.1
## + ratio:weight       1 0.0012068 0.15719 -1229.9
## + ratio:waist        1 0.0011259 0.15727 -1229.8
## + chol:hip           1 0.0010464 0.15735 -1229.8
## + age:gender         1 0.0009923 0.15740 -1229.7
## + waist:hip          1 0.0009168 0.15748 -1229.6
## + ratio:hip          1 0.0009024 0.15749 -1229.6
## + bp.1s:waist        1 0.0009023 0.15749 -1229.6
## + stab.glu:age       1 0.0008705 0.15752 -1229.5
## - weight:hip         1 0.0026296 0.16102 -1229.5
## + bp.1s:bp.1d        1 0.0008289 0.15757 -1229.5
## + height:hip         1 0.0008016 0.15759 -1229.5
## + gender:bp.1s       1 0.0007893 0.15760 -1229.5
## + chol:weight        1 0.0007722 0.15762 -1229.4
## - bp.1d:waist        1 0.0027227 0.16112 -1229.4
## + age:time.ppn       1 0.0006956 0.15770 -1229.3
## + gender:waist       1 0.0006331 0.15776 -1229.3
## + gender:hip         1 0.0004906 0.15790 -1229.1
## + chol:gender        1 0.0004701 0.15792 -1229.1
## + hdl:gender         1 0.0004614 0.15793 -1229.1
## + hdl:age            1 0.0004544 0.15794 -1229.1
## + hdl:waist          1 0.0004436 0.15795 -1229.1
## + location           1 0.0004346 0.15796 -1229.0
## + height:weight      1 0.0004199 0.15797 -1229.0
## + age:bp.1s          1 0.0003738 0.15802 -1229.0
## + ratio:time.ppn     1 0.0003629 0.15803 -1229.0
## + chol:hdl           1 0.0003579 0.15804 -1229.0
## + height:waist       1 0.0003172 0.15808 -1228.9
## + height:bp.1s       1 0.0003001 0.15809 -1228.9
## - stab.glu:waist     1 0.0031958 0.16159 -1228.9
## + bp.1d:time.ppn     1 0.0002723 0.15812 -1228.9
## + gender:bp.1d       1 0.0002507 0.15814 -1228.8
## + weight:waist       1 0.0002482 0.15815 -1228.8
## + age:height         1 0.0002400 0.15815 -1228.8
## + chol:waist         1 0.0002207 0.15817 -1228.8
## + chol:height        1 0.0001755 0.15822 -1228.8
## - age:waist          1 0.0033289 0.16172 -1228.7
## + hdl:time.ppn       1 0.0001598 0.15823 -1228.7
## + weight:bp.1d       1 0.0001492 0.15824 -1228.7
## + age:weight         1 0.0001326 0.15826 -1228.7
## + ratio:gender       1 0.0001308 0.15826 -1228.7
## + stab.glu:hdl       1 0.0001240 0.15827 -1228.7
## + ratio:height       1 0.0001090 0.15829 -1228.7
## + weight:time.ppn    1 0.0001087 0.15829 -1228.7
## + gender:weight      1 0.0000826 0.15831 -1228.6
## + ratio:age          1 0.0000596 0.15834 -1228.6
## + stab.glu:height    1 0.0000512 0.15834 -1228.6
## + stab.glu:ratio     1 0.0000492 0.15835 -1228.6
## + chol:age           1 0.0000419 0.15835 -1228.6
## + gender:time.ppn    1 0.0000312 0.15836 -1228.6
## + chol:stab.glu      1 0.0000288 0.15837 -1228.6
## + chol:ratio         1 0.0000262 0.15837 -1228.6
## + stab.glu:bp.1d     1 0.0000249 0.15837 -1228.6
## + ratio:bp.1d        1 0.0000171 0.15838 -1228.6
## + height:bp.1d       1 0.0000115 0.15838 -1228.6
## + hdl:bp.1s          1 0.0000104 0.15838 -1228.6
## + hdl:height         1 0.0000104 0.15838 -1228.6
## + bp.1d:hip          1 0.0000085 0.15839 -1228.5
## + stab.glu:hip       1 0.0000015 0.15839 -1228.5
## + ratio:bp.1s        1 0.0000013 0.15839 -1228.5
## + hdl:hip            1 0.0000009 0.15839 -1228.5
## + chol:bp.1s         1 0.0000008 0.15839 -1228.5
## + chol:bp.1d         1 0.0000004 0.15839 -1228.5
## + hdl:bp.1d          1 0.0000001 0.15839 -1228.5
## + stab.glu:weight    1 0.0000001 0.15839 -1228.5
## - chol:time.ppn      1 0.0036303 0.16203 -1228.4
## - hdl:weight         1 0.0049263 0.16332 -1226.9
## + frame              2 0.0000758 0.15832 -1226.6
## - weight:bp.1s       1 0.0054151 0.16381 -1226.4
## - hip:time.ppn       1 0.0069559 0.16535 -1224.7
## - stab.glu:time.ppn  1 0.0071630 0.16556 -1224.5
## - gender:height      1 0.0072488 0.16564 -1224.4
## - stab.glu:bp.1s     1 0.0102983 0.16869 -1221.0
## - age:hip            1 0.0122841 0.17068 -1218.9
## - stab.glu:gender    1 0.0129067 0.17130 -1218.2
## - hdl:ratio          1 0.0160045 0.17440 -1214.9
## - age:bp.1d          1 0.0160819 0.17448 -1214.8
## 
## Step:  AIC=-1230.61
## 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + age + gender + 
##     height + weight + bp.1s + bp.1d + waist + hip + time.ppn + 
##     stab.glu:gender + hdl:ratio + age:bp.1d + weight:bp.1s + 
##     age:hip + hip:time.ppn + gender:height + stab.glu:bp.1s + 
##     stab.glu:time.ppn + stab.glu:waist + age:waist + chol:time.ppn + 
##     hdl:weight + bp.1d:waist + weight:hip
## 
##                     Df Sum of Sq     RSS     AIC
## <none>                           0.16008 -1230.6
## + waist:time.ppn     1 0.0016817 0.15839 -1230.5
## + ratio:waist        1 0.0015327 0.15854 -1230.4
## + bp.1s:hip          1 0.0015135 0.15856 -1230.3
## + height:time.ppn    1 0.0014705 0.15860 -1230.3
## + age:gender         1 0.0013284 0.15875 -1230.1
## + ratio:weight       1 0.0013265 0.15875 -1230.1
## + stab.glu:age       1 0.0011735 0.15890 -1230.0
## + chol:hip           1 0.0010385 0.15904 -1229.8
## + bp.1s:waist        1 0.0010297 0.15905 -1229.8
## + hdl:waist          1 0.0009843 0.15909 -1229.7
## + hdl:age            1 0.0009464 0.15913 -1229.7
## + chol:weight        1 0.0008909 0.15918 -1229.6
## - age:waist          1 0.0026645 0.16274 -1229.6
## + gender:bp.1s       1 0.0007687 0.15931 -1229.5
## + ratio:hip          1 0.0007643 0.15931 -1229.5
## + bp.1s:bp.1d        1 0.0007530 0.15932 -1229.5
## + chol:hdl           1 0.0007233 0.15935 -1229.4
## + height:hip         1 0.0006582 0.15942 -1229.4
## + gender:waist       1 0.0006378 0.15944 -1229.3
## + bp.1s:time.ppn     1 0.0006340 0.15944 -1229.3
## + weight:time.ppn    1 0.0005330 0.15954 -1229.2
## + hdl:gender         1 0.0005214 0.15956 -1229.2
## + waist:hip          1 0.0004975 0.15958 -1229.2
## - weight:hip         1 0.0030554 0.16313 -1229.2
## + chol:gender        1 0.0004563 0.15962 -1229.1
## + ratio:time.ppn     1 0.0004448 0.15963 -1229.1
## + height:waist       1 0.0004256 0.15965 -1229.1
## + gender:hip         1 0.0004152 0.15966 -1229.1
## + age:height         1 0.0003813 0.15970 -1229.0
## + height:weight      1 0.0003689 0.15971 -1229.0
## + location           1 0.0003448 0.15973 -1229.0
## + height:bp.1s       1 0.0003441 0.15973 -1229.0
## + stab.glu:hdl       1 0.0003229 0.15975 -1229.0
## + age:bp.1s          1 0.0003011 0.15978 -1229.0
## + gender:time.ppn    1 0.0002616 0.15981 -1228.9
## + hdl:time.ppn       1 0.0002597 0.15982 -1228.9
## + gender:bp.1d       1 0.0002570 0.15982 -1228.9
## + chol:height        1 0.0002160 0.15986 -1228.9
## + chol:waist         1 0.0002070 0.15987 -1228.8
## + ratio:age          1 0.0001919 0.15988 -1228.8
## + ratio:gender       1 0.0001717 0.15990 -1228.8
## + weight:bp.1d       1 0.0001321 0.15994 -1228.8
## + hdl:bp.1s          1 0.0001248 0.15995 -1228.8
## + chol:ratio         1 0.0001080 0.15997 -1228.7
## - bp.1d:waist        1 0.0034327 0.16351 -1228.7
## + stab.glu:weight    1 0.0000996 0.15998 -1228.7
## + ratio:height       1 0.0000950 0.15998 -1228.7
## + chol:age           1 0.0000949 0.15998 -1228.7
## + weight:waist       1 0.0000859 0.15999 -1228.7
## + stab.glu:height    1 0.0000835 0.15999 -1228.7
## + gender:weight      1 0.0000707 0.16001 -1228.7
## + age:weight         1 0.0000596 0.16002 -1228.7
## + bp.1d:time.ppn     1 0.0000436 0.16003 -1228.7
## + stab.glu:bp.1d     1 0.0000360 0.16004 -1228.7
## + ratio:bp.1s        1 0.0000336 0.16004 -1228.7
## + hdl:bp.1d          1 0.0000315 0.16004 -1228.7
## + chol:stab.glu      1 0.0000311 0.16004 -1228.7
## + age:time.ppn       1 0.0000293 0.16005 -1228.7
## + stab.glu:ratio     1 0.0000124 0.16006 -1228.6
## + hdl:height         1 0.0000101 0.16007 -1228.6
## + chol:bp.1s         1 0.0000053 0.16007 -1228.6
## + height:bp.1d       1 0.0000037 0.16007 -1228.6
## + stab.glu:hip       1 0.0000021 0.16007 -1228.6
## + chol:bp.1d         1 0.0000003 0.16008 -1228.6
## + ratio:bp.1d        1 0.0000000 0.16008 -1228.6
## + bp.1d:hip          1 0.0000000 0.16008 -1228.6
## + hdl:hip            1 0.0000000 0.16008 -1228.6
## - stab.glu:waist     1 0.0037104 0.16379 -1228.4
## - chol:time.ppn      1 0.0040752 0.16415 -1228.0
## + frame              2 0.0000144 0.16006 -1226.6
## - hdl:weight         1 0.0054383 0.16551 -1226.5
## - stab.glu:time.ppn  1 0.0059633 0.16604 -1225.9
## - weight:bp.1s       1 0.0060743 0.16615 -1225.8
## - hip:time.ppn       1 0.0073113 0.16739 -1224.4
## - gender:height      1 0.0082297 0.16831 -1223.4
## - stab.glu:bp.1s     1 0.0096910 0.16977 -1221.9
## - age:hip            1 0.0109318 0.17101 -1220.5
## - stab.glu:gender    1 0.0120288 0.17211 -1219.3
## - hdl:ratio          1 0.0153501 0.17543 -1215.8
## - age:bp.1d          1 0.0155477 0.17562 -1215.7
# Step:  AIC=-1230.61
# 1/data.t$glyhb ~ chol + stab.glu + hdl + ratio + age + gender + 
#   height + weight + bp.1s + bp.1d + waist + hip + time.ppn + 
#   stab.glu:gender + hdl:ratio + age:bp.1d + weight:bp.1s + 
#   age:hip + hip:time.ppn + gender:height + stab.glu:bp.1s + 
#   stab.glu:time.ppn + stab.glu:waist + age:waist + chol:time.ppn + 
#   hdl:weight + bp.1d:waist + weight:hip

#10
n = nrow(data.t)
bic.fs1=n*log(sse.fs1)+p.fs1*log(n)-n*log(n)
bic.fs1 #-1182.677
## [1] -1182.677
sse.fs2=sum(fs2$residuals^2)
p.fs2=length(fs2$coefficients)
bic.fs2=n*log(sse.fs2)+p.fs2*log(n)-n*log(n)
bic.fs2 #-1137.536
## [1] -1137.536
#set Models 4.1 and 4.2
Model4.1 = fs2
Model4.2 = fs1

#11
PRESSModel3.1 = sum(Model3.1$residuals^2/(1-influence(Model3.1)$hat)^2)
PRESSModel3.2 = sum(Model3.2$residuals^2/(1-influence(Model3.2)$hat)^2)
PRESSModel3.3 = sum(Model3.3$residuals^2/(1-influence(Model3.3)$hat)^2)
PRESSModel4.1 = sum(Model4.1$residuals^2/(1-influence(Model4.1)$hat)^2)
PRESSModel4.2 = sum(Model4.2$residuals^2/(1-influence(Model4.2)$hat)^2)
PRESSModel3.1 #0.252777
## [1] 0.252777
PRESSModel3.2 #0.2539834
## [1] 0.2539834
PRESSModel3.3 #0.252575
## [1] 0.252575
PRESSModel4.1 #0.2171946
## [1] 0.2171946
PRESSModel4.2 #0.2534834
## [1] 0.2534834
#12
Yhat.3.1 = predict(Model3.1, newdata=data.v)
Y.3.1 = 1/data.v[,5]
m = nrow(data.v)
MSPR.3.1 = sum((Yhat.3.1-Y.3.1)^2)/m
MSPR.3.1 #0.001368448
## [1] 0.001368448
Yhat.3.2 = predict(Model3.2, newdata=data.v)
Y.3.2 = 1/data.v[,5]
MSPR.3.2 = sum((Yhat.3.2-Y.3.2)^2)/m
MSPR.3.2 #0.001377312
## [1] 0.001377312
Yhat.3.3 = predict(Model3.3, newdata=data.v)
Y.3.3 = 1/data.v[,5]
MSPR.3.3 = sum((Yhat.3.3-Y.3.3)^2)/m
MSPR.3.3 #0.00134099
## [1] 0.00134099
Yhat.4.1 = predict(Model4.1, newdata=data.v)
Y.4.1 = 1/data.v[,5]
MSPR.4.1 = sum((Yhat.4.1-Y.4.1)^2)/m
MSPR.4.1 #0.001797609
## [1] 0.001797609
Yhat.4.2 = predict(Model4.2, newdata=data.v)
Y.4.2 = 1/data.v[,5]
MSPR.4.2 = sum((Yhat.4.2-Y.4.2)^2)/m
MSPR.4.2 #0.00152642
## [1] 0.00152642
m = nrow(data.t)
PRESSModel3.1/m #0.001381295
## [1] 0.001381295
PRESSModel3.2/m #0.001387887
## [1] 0.001387887
PRESSModel3.3/m #0.001380191
## [1] 0.001380191
PRESSModel4.1/m #0.001186856
## [1] 0.001186856
PRESSModel4.2/m #0.001385155
## [1] 0.001385155
#13
#Re-create qualitative variable framesmall with 'mydata'
is.factor(mydata[,11]) #TRUE
## [1] TRUE
summary(mydata$frame)
##  large medium  small 
##     96    172     98
small.index2=which(mydata$frame=="small")
small.index2 #observations of frame = small
##  [1]   9  24  50  57  65  72  73  82  94  99 101 104 105 106 109 115 117
## [18] 120 121 126 127 129 130 134 141 147 148 151 152 153 157 160 164 165
## [35] 174 175 176 177 181 185 186 189 191 195 196 199 200 205 214 223 224
## [52] 228 231 247 248 250 252 259 260 262 269 270 271 274 275 276 280 281
## [69] 283 284 290 292 293 294 295 296 298 300 302 303 307 311 313 321 325
## [86] 327 328 329 331 332 336 337 338 342 343 349 355 365
#data.t[1:11]
n=dim(mydata)[1]
X11s2=rep(0,n)
X11s2[small.index2]=1 #small = 1, rest are 0
#Create Model 5
Model5 = lm(1/mydata$glyhb ~ stab.glu + ratio + age + X11s2 + waist + time.ppn, data=mydata)
summary(Model5)
## 
## Call:
## lm(formula = 1/mydata$glyhb ~ stab.glu + ratio + age + X11s2 + 
##     waist + time.ppn, data = mydata)
## 
## Residuals:
##       Min        1Q    Median        3Q       Max 
## -0.154503 -0.020705 -0.001382  0.019680  0.150207 
## 
## Coefficients:
##               Estimate Std. Error t value Pr(>|t|)    
## (Intercept)  3.414e-01  1.536e-02  22.221  < 2e-16 ***
## stab.glu    -4.947e-04  3.824e-05 -12.937  < 2e-16 ***
## ratio       -3.665e-03  1.187e-03  -3.088  0.00217 ** 
## age         -6.525e-04  1.230e-04  -5.306 1.97e-07 ***
## X11s2        2.008e-03  4.774e-03   0.421  0.67422    
## waist       -1.061e-03  3.737e-04  -2.839  0.00479 ** 
## time.ppn    -1.328e-05  6.176e-06  -2.150  0.03223 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 0.03628 on 359 degrees of freedom
## Multiple R-squared:  0.5075, Adjusted R-squared:  0.4993 
## F-statistic: 61.66 on 6 and 359 DF,  p-value: < 2.2e-16
anova(Model5)