Part 2

Box-plot - Type of dwelling v/s sales Price

Observaton: Single-family Detached & Townhouse End Unit has highest mean Sales price.

ggplot(house.train.df, aes(x=BldgType, y=SalePrice/1000, fill = BldgType)) + geom_boxplot()

Box-plot - Type of foundation v/s sales Price

Observation : Poured Contrete house has highest mean sale price and Slab House has least mean sale price.

ggplot(house.train.df, aes(x=Foundation, y=SalePrice/1000, fill =Foundation )) + geom_boxplot()

#### Box-plot - Neighborhood v/s sales Price

Observation : There are couple of neighborhoods which are highest mean sales price( e.g : Northridge Heights , Northridge , Stone Brook … )

ggplot(house.train.df, aes(x=Neighborhood, y=SalePrice/1000, fill=Neighborhood )) + 
  geom_boxplot() + coord_flip()

#### Box-plot - Overall Quality v/s sales Price

This shows the exactly the relation between Quality and sales price. As quality increases, the sales price goes high which makes sense.

house.train.df$OverallQual_factor <- as.factor(as.character(house.train.df$OverallQual))

ggplot(house.train.df, aes(x=OverallQual_factor, y=SalePrice/1000, fill = OverallQual_factor)) + 
  geom_boxplot() 

Now, lets build the correlation matrix to see the correlation between a set of variables on sales price.

Observation: High correlation observed for below independent Variables.

OverallQual: Rates the overall material and finish of the house

GrLivArea: Above grade (ground) living area square feet

GarageArea: Size of garage in square feet

TotalBsmtSF: Total square feet of basement area

YearBuilt: Original construction date

FullBath: Full bathrooms above grade

corr.data<-select(house.train.df,SalePrice,PoolArea,TotalBsmtSF,FullBath,LowQualFinSF, LotArea,BsmtUnfSF,GarageArea,YearBuilt,OverallQual,FullBath,GrLivArea,Fireplaces)
corr.data<-round(cor(corr.data),4)

corrplot(corr.data,method ="color")

Test the hypotheses that the correlations between each pairwise set of variables is 0 and provide an 80% confidence interval.

Lets test the hypothesis that correlation between two variable is 0 at 80% confidence interval.

GarageArea v/s Sales price.

The correlation is 0.6234314 and we are 80% confident that the correlaton between GarageArea and SalePrice is 0.6024756 and 0.6435283.

cor.test(house.train.df$SalePrice,house.train.df$GarageArea, conf.level = 0.8)
## 
##  Pearson's product-moment correlation
## 
## data:  house.train.df$SalePrice and house.train.df$GarageArea
## t = 30.446, df = 1458, p-value < 2.2e-16
## alternative hypothesis: true correlation is not equal to 0
## 80 percent confidence interval:
##  0.6024756 0.6435283
## sample estimates:
##       cor 
## 0.6234314

GrLivArea v/s Sales price.

The correlation is 0.7086245 and we are 80% confident that the correlaton between GrLivArea and SalePrice is 0.6915087 and 0.7249450

cor.test(house.train.df$SalePrice,house.train.df$GrLivArea, conf.level = 0.8)
## 
##  Pearson's product-moment correlation
## 
## data:  house.train.df$SalePrice and house.train.df$GrLivArea
## t = 38.348, df = 1458, p-value < 2.2e-16
## alternative hypothesis: true correlation is not equal to 0
## 80 percent confidence interval:
##  0.6915087 0.7249450
## sample estimates:
##       cor 
## 0.7086245

TotalBsmtSF v/s Sales price.

The correlation is 0.6135806 and we are 80% confident that the correlaton between TotalBsmtSF and SalePrice is 0.5922142 and 0.6340846

cor.test(house.train.df$SalePrice,house.train.df$TotalBsmtSF, conf.level = 0.8)
## 
##  Pearson's product-moment correlation
## 
## data:  house.train.df$SalePrice and house.train.df$TotalBsmtSF
## t = 29.671, df = 1458, p-value < 2.2e-16
## alternative hypothesis: true correlation is not equal to 0
## 80 percent confidence interval:
##  0.5922142 0.6340846
## sample estimates:
##       cor 
## 0.6135806

Invert your correlation matrix from above. (This is known as the precision matrix and contains variance inflation factors on the diagonal.) Multiply the correlation matrix by the precision matrix, and then multiply the precision matrix by the correlation matrix. Conduct LU decomposition on the matrix.

precision.matrix<-solve(corr.data)
round(precision.matrix, 4)
##              SalePrice PoolArea TotalBsmtSF FullBath LowQualFinSF LotArea
## SalePrice       4.6083   0.1249     -0.7749  -0.0021       0.0715 -0.2843
## PoolArea        0.1249   1.0568     -0.1626   0.0585      -0.0390 -0.0138
## TotalBsmtSF    -0.7749  -0.1626      2.0709   0.3476       0.0211 -0.2515
## FullBath       -0.0021   0.0585      0.3476   2.2299       0.0492 -0.0475
## LowQualFinSF    0.0715  -0.0390      0.0211   0.0492       1.0846  0.0153
## LotArea        -0.2843  -0.0138     -0.2515  -0.0475       0.0153  1.1987
## BsmtUnfSF       0.4181   0.1217     -0.6726  -0.3196      -0.0257  0.1080
## GarageArea     -0.5108   0.0191     -0.2470   0.0535       0.0628 -0.0631
## YearBuilt      -0.5782  -0.0198     -0.2843  -0.8270       0.1762  0.1354
## OverallQual    -1.7479   0.0062     -0.0272  -0.1325      -0.0406  0.3143
## GrLivArea      -1.4607  -0.2569     -0.1068  -1.3360      -0.3095 -0.0941
## Fireplaces     -0.2520  -0.0073     -0.1385   0.1416       0.0875 -0.1838
##              BsmtUnfSF GarageArea YearBuilt OverallQual GrLivArea
## SalePrice       0.4181    -0.5108   -0.5782     -1.7479   -1.4607
## PoolArea        0.1217     0.0191   -0.0198      0.0062   -0.2569
## TotalBsmtSF    -0.6726    -0.2470   -0.2843     -0.0272   -0.1068
## FullBath       -0.3196     0.0535   -0.8270     -0.1325   -1.3360
## LowQualFinSF   -0.0257     0.0628    0.1762     -0.0406   -0.3095
## LotArea         0.1080    -0.0631    0.1354      0.3143   -0.0941
## BsmtUnfSF       1.3782     0.0334    0.1729     -0.3776   -0.0566
## GarageArea      0.0334     1.8070   -0.3854     -0.1597   -0.2787
## YearBuilt       0.1729    -0.3854    2.1567     -0.6898    1.0830
## OverallQual    -0.3776    -0.1597   -0.6898      3.3030   -0.2876
## GrLivArea      -0.0566    -0.2787    1.0830     -0.2876    3.3274
## Fireplaces      0.1399     0.0870    0.0868     -0.2426   -0.4169
##              Fireplaces
## SalePrice       -0.2520
## PoolArea        -0.0073
## TotalBsmtSF     -0.1385
## FullBath         0.1416
## LowQualFinSF     0.0875
## LotArea         -0.1838
## BsmtUnfSF        0.1399
## GarageArea       0.0870
## YearBuilt        0.0868
## OverallQual     -0.2426
## GrLivArea       -0.4169
## Fireplaces       1.4279
round(corr.data %*% precision.matrix, 4)
##              SalePrice PoolArea TotalBsmtSF FullBath LowQualFinSF LotArea
## SalePrice            1        0           0        0            0       0
## PoolArea             0        1           0        0            0       0
## TotalBsmtSF          0        0           1        0            0       0
## FullBath             0        0           0        1            0       0
## LowQualFinSF         0        0           0        0            1       0
## LotArea              0        0           0        0            0       1
## BsmtUnfSF            0        0           0        0            0       0
## GarageArea           0        0           0        0            0       0
## YearBuilt            0        0           0        0            0       0
## OverallQual          0        0           0        0            0       0
## GrLivArea            0        0           0        0            0       0
## Fireplaces           0        0           0        0            0       0
##              BsmtUnfSF GarageArea YearBuilt OverallQual GrLivArea
## SalePrice            0          0         0           0         0
## PoolArea             0          0         0           0         0
## TotalBsmtSF          0          0         0           0         0
## FullBath             0          0         0           0         0
## LowQualFinSF         0          0         0           0         0
## LotArea              0          0         0           0         0
## BsmtUnfSF            1          0         0           0         0
## GarageArea           0          1         0           0         0
## YearBuilt            0          0         1           0         0
## OverallQual          0          0         0           1         0
## GrLivArea            0          0         0           0         1
## Fireplaces           0          0         0           0         0
##              Fireplaces
## SalePrice             0
## PoolArea              0
## TotalBsmtSF           0
## FullBath              0
## LowQualFinSF          0
## LotArea               0
## BsmtUnfSF             0
## GarageArea            0
## YearBuilt             0
## OverallQual           0
## GrLivArea             0
## Fireplaces            1
round(precision.matrix %*% corr.data, 4)
##              SalePrice PoolArea TotalBsmtSF FullBath LowQualFinSF LotArea
## SalePrice            1        0           0        0            0       0
## PoolArea             0        1           0        0            0       0
## TotalBsmtSF          0        0           1        0            0       0
## FullBath             0        0           0        1            0       0
## LowQualFinSF         0        0           0        0            1       0
## LotArea              0        0           0        0            0       1
## BsmtUnfSF            0        0           0        0            0       0
## GarageArea           0        0           0        0            0       0
## YearBuilt            0        0           0        0            0       0
## OverallQual          0        0           0        0            0       0
## GrLivArea            0        0           0        0            0       0
## Fireplaces           0        0           0        0            0       0
##              BsmtUnfSF GarageArea YearBuilt OverallQual GrLivArea
## SalePrice            0          0         0           0         0
## PoolArea             0          0         0           0         0
## TotalBsmtSF          0          0         0           0         0
## FullBath             0          0         0           0         0
## LowQualFinSF         0          0         0           0         0
## LotArea              0          0         0           0         0
## BsmtUnfSF            1          0         0           0         0
## GarageArea           0          1         0           0         0
## YearBuilt            0          0         1           0         0
## OverallQual          0          0         0           1         0
## GrLivArea            0          0         0           0         1
## Fireplaces           0          0         0           0         0
##              Fireplaces
## SalePrice             0
## PoolArea              0
## TotalBsmtSF           0
## FullBath              0
## LowQualFinSF          0
## LotArea               0
## BsmtUnfSF             0
## GarageArea            0
## YearBuilt             0
## OverallQual           0
## GrLivArea             0
## Fireplaces            1

Now, lets Do LU decomposition of correlation matrix

Using the LU function from my previous assignment.

factorize <- function(A) 
{
  if (nrow(A) == ncol(A)) 
  {
      size <- nrow(A)
      # Constructing a diagonal matrix. This will become the matrix L after factorization.
      L <- diag(size) 
      for (i in 1:(size - 1)) 
      {
          for (j in (i + 1):size) 
          {
              L[j, i] <- A[j, i] / A[i, i]  # building the L matrix
              A[j, ]  <- A[j, ] - L[j, i] * A[i, ] # building U matrix
          }
      }
      

  }
  result<-list(L,A)
  return(result)

}

Printing L and U Matrix.

result <- factorize(corr.data)
L <- result[[1]]
U <- result[[2]]

Lets check multipling L and U gives back the actual correlation data. Verified that both L*U and the actual correlation matrix is same.

corr.data_1 <- round(L %*% U ,4)

corr.data_1 == corr.data
##       SalePrice PoolArea TotalBsmtSF FullBath LowQualFinSF LotArea
##  [1,]      TRUE     TRUE        TRUE     TRUE         TRUE    TRUE
##  [2,]      TRUE     TRUE        TRUE     TRUE         TRUE    TRUE
##  [3,]      TRUE     TRUE        TRUE     TRUE         TRUE    TRUE
##  [4,]      TRUE     TRUE        TRUE     TRUE         TRUE    TRUE
##  [5,]      TRUE     TRUE        TRUE     TRUE         TRUE    TRUE
##  [6,]      TRUE     TRUE        TRUE     TRUE         TRUE    TRUE
##  [7,]      TRUE     TRUE        TRUE     TRUE         TRUE    TRUE
##  [8,]      TRUE     TRUE        TRUE     TRUE         TRUE    TRUE
##  [9,]      TRUE     TRUE        TRUE     TRUE         TRUE    TRUE
## [10,]      TRUE     TRUE        TRUE     TRUE         TRUE    TRUE
## [11,]      TRUE     TRUE        TRUE     TRUE         TRUE    TRUE
## [12,]      TRUE     TRUE        TRUE     TRUE         TRUE    TRUE
##       BsmtUnfSF GarageArea YearBuilt OverallQual GrLivArea Fireplaces
##  [1,]      TRUE       TRUE      TRUE        TRUE      TRUE       TRUE
##  [2,]      TRUE       TRUE      TRUE        TRUE      TRUE       TRUE
##  [3,]      TRUE       TRUE      TRUE        TRUE      TRUE       TRUE
##  [4,]      TRUE       TRUE      TRUE        TRUE      TRUE       TRUE
##  [5,]      TRUE       TRUE      TRUE        TRUE      TRUE       TRUE
##  [6,]      TRUE       TRUE      TRUE        TRUE      TRUE       TRUE
##  [7,]      TRUE       TRUE      TRUE        TRUE      TRUE       TRUE
##  [8,]      TRUE       TRUE      TRUE        TRUE      TRUE       TRUE
##  [9,]      TRUE       TRUE      TRUE        TRUE      TRUE       TRUE
## [10,]      TRUE       TRUE      TRUE        TRUE      TRUE       TRUE
## [11,]      TRUE       TRUE      TRUE        TRUE      TRUE       TRUE
## [12,]      TRUE       TRUE      TRUE        TRUE      TRUE       TRUE

Feature Engineering and Selection.

As a first step, we will convert the MSSubClass column into a factor variable and dropping some columns which are having null values.

library(caTools)
set.seed(123)

head(house.train.df)
##   Id MSSubClass MSZoning LotFrontage LotArea Street Alley LotShape
## 1  1         60       RL          65    8450   Pave  <NA>      Reg
## 2  2         20       RL          80    9600   Pave  <NA>      Reg
## 3  3         60       RL          68   11250   Pave  <NA>      IR1
## 4  4         70       RL          60    9550   Pave  <NA>      IR1
## 5  5         60       RL          84   14260   Pave  <NA>      IR1
## 6  6         50       RL          85   14115   Pave  <NA>      IR1
##   LandContour Utilities LotConfig LandSlope Neighborhood Condition1
## 1         Lvl    AllPub    Inside       Gtl      CollgCr       Norm
## 2         Lvl    AllPub       FR2       Gtl      Veenker      Feedr
## 3         Lvl    AllPub    Inside       Gtl      CollgCr       Norm
## 4         Lvl    AllPub    Corner       Gtl      Crawfor       Norm
## 5         Lvl    AllPub       FR2       Gtl      NoRidge       Norm
## 6         Lvl    AllPub    Inside       Gtl      Mitchel       Norm
##   Condition2 BldgType HouseStyle OverallQual OverallCond YearBuilt
## 1       Norm     1Fam     2Story           7           5      2003
## 2       Norm     1Fam     1Story           6           8      1976
## 3       Norm     1Fam     2Story           7           5      2001
## 4       Norm     1Fam     2Story           7           5      1915
## 5       Norm     1Fam     2Story           8           5      2000
## 6       Norm     1Fam     1.5Fin           5           5      1993
##   YearRemodAdd RoofStyle RoofMatl Exterior1st Exterior2nd MasVnrType
## 1         2003     Gable  CompShg     VinylSd     VinylSd    BrkFace
## 2         1976     Gable  CompShg     MetalSd     MetalSd       None
## 3         2002     Gable  CompShg     VinylSd     VinylSd    BrkFace
## 4         1970     Gable  CompShg     Wd Sdng     Wd Shng       None
## 5         2000     Gable  CompShg     VinylSd     VinylSd    BrkFace
## 6         1995     Gable  CompShg     VinylSd     VinylSd       None
##   MasVnrArea ExterQual ExterCond Foundation BsmtQual BsmtCond BsmtExposure
## 1        196        Gd        TA      PConc       Gd       TA           No
## 2          0        TA        TA     CBlock       Gd       TA           Gd
## 3        162        Gd        TA      PConc       Gd       TA           Mn
## 4          0        TA        TA     BrkTil       TA       Gd           No
## 5        350        Gd        TA      PConc       Gd       TA           Av
## 6          0        TA        TA       Wood       Gd       TA           No
##   BsmtFinType1 BsmtFinSF1 BsmtFinType2 BsmtFinSF2 BsmtUnfSF TotalBsmtSF
## 1          GLQ        706          Unf          0       150         856
## 2          ALQ        978          Unf          0       284        1262
## 3          GLQ        486          Unf          0       434         920
## 4          ALQ        216          Unf          0       540         756
## 5          GLQ        655          Unf          0       490        1145
## 6          GLQ        732          Unf          0        64         796
##   Heating HeatingQC CentralAir Electrical X1stFlrSF X2ndFlrSF LowQualFinSF
## 1    GasA        Ex          Y      SBrkr       856       854            0
## 2    GasA        Ex          Y      SBrkr      1262         0            0
## 3    GasA        Ex          Y      SBrkr       920       866            0
## 4    GasA        Gd          Y      SBrkr       961       756            0
## 5    GasA        Ex          Y      SBrkr      1145      1053            0
## 6    GasA        Ex          Y      SBrkr       796       566            0
##   GrLivArea BsmtFullBath BsmtHalfBath FullBath HalfBath BedroomAbvGr
## 1      1710            1            0        2        1            3
## 2      1262            0            1        2        0            3
## 3      1786            1            0        2        1            3
## 4      1717            1            0        1        0            3
## 5      2198            1            0        2        1            4
## 6      1362            1            0        1        1            1
##   KitchenAbvGr KitchenQual TotRmsAbvGrd Functional Fireplaces FireplaceQu
## 1            1          Gd            8        Typ          0        <NA>
## 2            1          TA            6        Typ          1          TA
## 3            1          Gd            6        Typ          1          TA
## 4            1          Gd            7        Typ          1          Gd
## 5            1          Gd            9        Typ          1          TA
## 6            1          TA            5        Typ          0        <NA>
##   GarageType GarageYrBlt GarageFinish GarageCars GarageArea GarageQual
## 1     Attchd        2003          RFn          2        548         TA
## 2     Attchd        1976          RFn          2        460         TA
## 3     Attchd        2001          RFn          2        608         TA
## 4     Detchd        1998          Unf          3        642         TA
## 5     Attchd        2000          RFn          3        836         TA
## 6     Attchd        1993          Unf          2        480         TA
##   GarageCond PavedDrive WoodDeckSF OpenPorchSF EnclosedPorch X3SsnPorch
## 1         TA          Y          0          61             0          0
## 2         TA          Y        298           0             0          0
## 3         TA          Y          0          42             0          0
## 4         TA          Y          0          35           272          0
## 5         TA          Y        192          84             0          0
## 6         TA          Y         40          30             0        320
##   ScreenPorch PoolArea PoolQC Fence MiscFeature MiscVal MoSold YrSold
## 1           0        0   <NA>  <NA>        <NA>       0      2   2008
## 2           0        0   <NA>  <NA>        <NA>       0      5   2007
## 3           0        0   <NA>  <NA>        <NA>       0      9   2008
## 4           0        0   <NA>  <NA>        <NA>       0      2   2006
## 5           0        0   <NA>  <NA>        <NA>       0     12   2008
## 6           0        0   <NA> MnPrv        Shed     700     10   2009
##   SaleType SaleCondition SalePrice OverallQual_factor
## 1       WD        Normal    208500                  7
## 2       WD        Normal    181500                  6
## 3       WD        Normal    223500                  7
## 4       WD       Abnorml    140000                  7
## 5       WD        Normal    250000                  8
## 6       WD        Normal    143000                  5
house.train.df$MSSubClass = factor(house.train.df$MSSubClass, levels = c(20, 30, 40 , 45, 50, 60, 70, 75, 80, 85, 90, 120, 150, 160, 180, 190))


house.test.df$MSSubClass = factor(house.test.df$MSSubClass, levels = c(20, 30, 40 , 45, 50, 60, 70, 75, 80, 85, 90, 120, 150, 160, 180, 190))

house.train.df <- house.train.df[, -which(colMeans(is.na(house.train.df)) > 0)]

Performing a backward elimination method to filter some of the independent variables which are not significant or less related

lm1 <- lm(data = house.train.df , formula = SalePrice ~ . )
summary(lm1)
## 
## Call:
## lm(formula = SalePrice ~ ., data = house.train.df)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -174317   -9455       0    8907  174317 
## 
## Coefficients: (5 not defined because of singularities)
##                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)          -1.956e+06  1.008e+06  -1.941 0.052490 .  
## Id                   -2.747e-01  1.510e+00  -0.182 0.855690    
## MSSubClass30          1.872e+03  4.606e+03   0.406 0.684563    
## MSSubClass40          7.951e+02  1.428e+04   0.056 0.955620    
## MSSubClass45         -1.009e+04  2.201e+04  -0.458 0.646913    
## MSSubClass50          3.149e+01  8.538e+03   0.004 0.997057    
## MSSubClass60          1.833e+03  7.438e+03   0.246 0.805345    
## MSSubClass70          4.784e+03  8.096e+03   0.591 0.554684    
## MSSubClass75         -1.072e+04  1.490e+04  -0.719 0.472101    
## MSSubClass80         -7.009e+03  1.236e+04  -0.567 0.570719    
## MSSubClass85         -6.669e+03  1.038e+04  -0.642 0.520874    
## MSSubClass90         -3.555e+03  6.940e+03  -0.512 0.608604    
## MSSubClass120        -9.579e+03  1.443e+04  -0.664 0.506819    
## MSSubClass160        -5.408e+03  1.713e+04  -0.316 0.752320    
## MSSubClass180        -3.425e+03  1.915e+04  -0.179 0.858092    
## MSSubClass190         5.687e+03  2.709e+04   0.210 0.833752    
## MSZoningFV            3.611e+04  1.186e+04   3.044 0.002381 ** 
## MSZoningRH            3.253e+04  1.196e+04   2.721 0.006602 ** 
## MSZoningRL            3.376e+04  1.025e+04   3.294 0.001015 ** 
## MSZoningRM            3.301e+04  9.593e+03   3.441 0.000599 ***
## LotArea               6.840e-01  1.040e-01   6.577 7.03e-11 ***
## StreetPave            3.169e+04  1.216e+04   2.606 0.009275 ** 
## LotShapeIR2           6.161e+03  4.086e+03   1.508 0.131808    
## LotShapeIR3           6.590e+03  8.307e+03   0.793 0.427737    
## LotShapeReg           3.380e+02  1.578e+03   0.214 0.830399    
## LandContourHLS        9.346e+03  5.066e+03   1.845 0.065262 .  
## LandContourLow       -3.914e+03  6.362e+03  -0.615 0.538543    
## LandContourLvl        7.463e+03  3.635e+03   2.053 0.040296 *  
## UtilitiesNoSeWa      -3.614e+04  2.724e+04  -1.326 0.184920    
## LotConfigCulDSac      6.887e+03  3.145e+03   2.190 0.028735 *  
## LotConfigFR2         -6.623e+03  3.936e+03  -1.683 0.092705 .  
## LotConfigFR3         -1.574e+04  1.238e+04  -1.272 0.203748    
## LotConfigInside      -1.149e+03  1.707e+03  -0.673 0.500899    
## LandSlopeMod          1.102e+04  3.871e+03   2.847 0.004488 ** 
## LandSlopeSev         -2.845e+04  1.078e+04  -2.640 0.008403 ** 
## NeighborhoodBlueste  -7.027e+03  1.885e+04  -0.373 0.709350    
## NeighborhoodBrDale    2.017e+03  1.143e+04   0.176 0.860013    
## NeighborhoodBrkSide  -4.476e+03  9.176e+03  -0.488 0.625759    
## NeighborhoodClearCr  -8.225e+03  9.079e+03  -0.906 0.365160    
## NeighborhoodCollgCr  -9.328e+03  7.045e+03  -1.324 0.185689    
## NeighborhoodCrawfor   1.154e+04  8.389e+03   1.376 0.169045    
## NeighborhoodEdwards  -1.935e+04  7.830e+03  -2.471 0.013612 *  
## NeighborhoodGilbert  -1.190e+04  7.532e+03  -1.579 0.114505    
## NeighborhoodIDOTRR   -9.434e+03  1.046e+04  -0.902 0.367494    
## NeighborhoodMeadowV  -1.941e+04  1.193e+04  -1.627 0.104028    
## NeighborhoodMitchel  -1.855e+04  7.943e+03  -2.336 0.019653 *  
## NeighborhoodNAmes    -1.381e+04  7.616e+03  -1.813 0.070115 .  
## NeighborhoodNoRidge   2.103e+04  8.100e+03   2.597 0.009519 ** 
## NeighborhoodNPkVill   6.606e+03  1.356e+04   0.487 0.626295    
## NeighborhoodNridgHt   1.540e+04  7.112e+03   2.166 0.030506 *  
## NeighborhoodNWAmes   -1.684e+04  7.834e+03  -2.150 0.031783 *  
## NeighborhoodOldTown  -1.469e+04  9.296e+03  -1.581 0.114201    
## NeighborhoodSawyer   -1.161e+04  7.885e+03  -1.473 0.141064    
## NeighborhoodSawyerW  -5.632e+03  7.546e+03  -0.746 0.455580    
## NeighborhoodSomerst  -1.501e+03  8.678e+03  -0.173 0.862670    
## NeighborhoodStoneBr   3.001e+04  8.116e+03   3.697 0.000227 ***
## NeighborhoodSWISU    -9.648e+03  9.488e+03  -1.017 0.309401    
## NeighborhoodTimber   -6.093e+03  8.074e+03  -0.755 0.450585    
## NeighborhoodVeenker   2.112e+03  1.023e+04   0.206 0.836494    
## Condition1Feedr       3.197e+03  4.851e+03   0.659 0.509939    
## Condition1Norm        1.248e+04  4.004e+03   3.117 0.001867 ** 
## Condition1PosA        1.221e+04  9.760e+03   1.251 0.211142    
## Condition1PosN        7.209e+03  7.231e+03   0.997 0.318978    
## Condition1RRAe       -1.299e+04  8.885e+03  -1.462 0.143869    
## Condition1RRAn        6.701e+03  6.647e+03   1.008 0.313574    
## Condition1RRNe       -8.014e+03  1.732e+04  -0.463 0.643607    
## Condition1RRNn        4.230e+03  1.242e+04   0.341 0.733407    
## Condition2Feedr       7.853e+03  2.432e+04   0.323 0.746774    
## Condition2Norm        3.813e+03  2.153e+04   0.177 0.859463    
## Condition2PosA       -3.631e+04  3.781e+04  -0.960 0.337035    
## Condition2PosN       -2.595e+05  2.869e+04  -9.045  < 2e-16 ***
## Condition2RRAe       -1.283e+05  4.833e+04  -2.655 0.008020 ** 
## Condition2RRAn       -2.617e+03  3.211e+04  -0.082 0.935039    
## Condition2RRNn        6.273e+03  2.796e+04   0.224 0.822514    
## BldgType2fmCon       -1.259e+04  2.645e+04  -0.476 0.633990    
## BldgTypeDuplex               NA         NA      NA       NA    
## BldgTypeTwnhs        -1.238e+04  1.536e+04  -0.806 0.420571    
## BldgTypeTwnhsE       -9.055e+03  1.464e+04  -0.618 0.536368    
## HouseStyle1.5Unf      2.043e+04  2.183e+04   0.936 0.349514    
## HouseStyle1Story      4.356e+03  8.595e+03   0.507 0.612390    
## HouseStyle2.5Fin     -8.717e+03  1.659e+04  -0.525 0.599340    
## HouseStyle2.5Unf      4.867e+03  1.580e+04   0.308 0.758145    
## HouseStyle2Story     -8.303e+03  7.812e+03  -1.063 0.288032    
## HouseStyleSFoyer      9.085e+03  1.136e+04   0.799 0.424203    
## HouseStyleSLvl        1.178e+04  1.330e+04   0.886 0.375851    
## OverallQual           6.760e+03  2.805e+03   2.410 0.016095 *  
## OverallCond           6.609e+03  8.407e+02   7.861 8.15e-15 ***
## YearBuilt             4.028e+02  7.782e+01   5.177 2.63e-07 ***
## YearRemodAdd          7.559e+01  5.239e+01   1.443 0.149328    
## RoofStyleGable       -2.008e+03  1.767e+04  -0.114 0.909530    
## RoofStyleGambrel     -4.304e+02  1.939e+04  -0.022 0.982290    
## RoofStyleHip         -6.709e+02  1.771e+04  -0.038 0.969780    
## RoofStyleMansard      1.353e+04  2.063e+04   0.656 0.511866    
## RoofStyleShed         9.282e+04  3.633e+04   2.555 0.010745 *  
## RoofMatlCompShg       6.868e+05  3.153e+04  21.781  < 2e-16 ***
## RoofMatlMembran       7.717e+05  4.533e+04  17.023  < 2e-16 ***
## RoofMatlMetal         7.316e+05  4.493e+04  16.284  < 2e-16 ***
## RoofMatlRoll          6.956e+05  3.996e+04  17.409  < 2e-16 ***
## RoofMatlTar&Grv       6.891e+05  3.609e+04  19.096  < 2e-16 ***
## RoofMatlWdShake       6.658e+05  3.504e+04  18.999  < 2e-16 ***
## RoofMatlWdShngl       7.415e+05  3.254e+04  22.790  < 2e-16 ***
## Exterior1stAsphShn   -1.707e+03  3.198e+04  -0.053 0.957443    
## Exterior1stBrkComm   -3.638e+03  2.745e+04  -0.133 0.894581    
## Exterior1stBrkFace    9.879e+03  1.192e+04   0.829 0.407378    
## Exterior1stCBlock    -2.346e+04  2.661e+04  -0.882 0.378038    
## Exterior1stCemntBd    4.147e+03  1.832e+04   0.226 0.820969    
## Exterior1stHdBoard   -8.173e+03  1.197e+04  -0.682 0.495056    
## Exterior1stImStucc   -5.419e+04  2.693e+04  -2.012 0.044418 *  
## Exterior1stMetalSd    1.809e+03  1.383e+04   0.131 0.895943    
## Exterior1stPlywood   -9.922e+03  1.186e+04  -0.837 0.402895    
## Exterior1stStone     -4.657e+03  2.289e+04  -0.203 0.838801    
## Exterior1stStucco     1.848e+03  1.322e+04   0.140 0.888833    
## Exterior1stVinylSd   -1.211e+04  1.263e+04  -0.958 0.338006    
## Exterior1stWd Sdng   -7.938e+03  1.149e+04  -0.691 0.489947    
## Exterior1stWdShing   -5.278e+03  1.245e+04  -0.424 0.671612    
## Exterior2ndAsphShn    5.596e+03  2.153e+04   0.260 0.794963    
## Exterior2ndBrk Cmn    7.996e+03  1.999e+04   0.400 0.689233    
## Exterior2ndBrkFace    1.544e+03  1.260e+04   0.122 0.902546    
## Exterior2ndCBlock            NA         NA      NA       NA    
## Exterior2ndCmentBd   -6.255e+02  1.817e+04  -0.034 0.972541    
## Exterior2ndHdBoard    7.412e+03  1.180e+04   0.628 0.529887    
## Exterior2ndImStucc    2.662e+04  1.369e+04   1.945 0.051970 .  
## Exterior2ndMetalSd    2.477e+03  1.373e+04   0.180 0.856850    
## Exterior2ndOther     -6.188e+03  2.665e+04  -0.232 0.816421    
## Exterior2ndPlywood    7.656e+03  1.148e+04   0.667 0.504852    
## Exterior2ndStone     -7.546e+03  1.643e+04  -0.459 0.646181    
## Exterior2ndStucco     2.092e+03  1.290e+04   0.162 0.871191    
## Exterior2ndVinylSd    1.510e+04  1.243e+04   1.216 0.224393    
## Exterior2ndWd Sdng    1.088e+04  1.133e+04   0.960 0.337173    
## Exterior2ndWd Shng    7.122e+03  1.180e+04   0.603 0.546310    
## ExterQualFa           6.865e+03  1.183e+04   0.580 0.561726    
## ExterQualGd          -7.094e+03  4.991e+03  -1.421 0.155428    
## ExterQualTA          -7.567e+03  5.435e+03  -1.392 0.164124    
## ExterCondFa          -4.826e+03  1.779e+04  -0.271 0.786212    
## ExterCondGd          -9.848e+03  1.700e+04  -0.579 0.562387    
## ExterCondPo          -1.939e+03  3.183e+04  -0.061 0.951436    
## ExterCondTA          -6.184e+03  1.696e+04  -0.365 0.715424    
## FoundationCBlock      1.095e+03  3.083e+03   0.355 0.722496    
## FoundationPConc       5.023e+03  3.372e+03   1.490 0.136589    
## FoundationSlab        3.370e+03  7.572e+03   0.445 0.656352    
## FoundationStone       7.744e+03  1.038e+04   0.746 0.455596    
## FoundationWood       -3.844e+04  1.431e+04  -2.686 0.007337 ** 
## BsmtFinSF1            3.519e+01  4.221e+00   8.337  < 2e-16 ***
## BsmtFinSF2            2.453e+01  5.506e+00   4.455 9.15e-06 ***
## BsmtUnfSF             1.471e+01  3.883e+00   3.790 0.000158 ***
## TotalBsmtSF                  NA         NA      NA       NA    
## HeatingGasA           4.883e+03  2.471e+04   0.198 0.843365    
## HeatingGasW           1.345e+03  2.548e+04   0.053 0.957903    
## HeatingGrav          -4.044e+03  2.668e+04  -0.152 0.879575    
## HeatingOthW          -2.433e+04  3.051e+04  -0.798 0.425303    
## HeatingWall           1.633e+04  2.796e+04   0.584 0.559388    
## HeatingQCFa          -2.895e+03  4.565e+03  -0.634 0.526129    
## HeatingQCGd          -2.758e+03  2.035e+03  -1.355 0.175534    
## HeatingQCPo           4.500e+03  2.599e+04   0.173 0.862554    
## HeatingQCTA          -3.546e+03  2.007e+03  -1.767 0.077442 .  
## CentralAirY          -1.151e+03  3.727e+03  -0.309 0.757405    
## X1stFlrSF             5.318e+01  5.080e+00  10.469  < 2e-16 ***
## X2ndFlrSF             6.467e+01  5.085e+00  12.717  < 2e-16 ***
## LowQualFinSF          1.758e+01  1.807e+01   0.973 0.330897    
## GrLivArea                    NA         NA      NA       NA    
## BsmtFullBath          2.063e+03  1.870e+03   1.104 0.270013    
## BsmtHalfBath          1.171e+03  2.943e+03   0.398 0.690875    
## FullBath              3.113e+03  2.148e+03   1.450 0.147413    
## HalfBath              1.041e+02  2.033e+03   0.051 0.959180    
## BedroomAbvGr         -3.388e+03  1.356e+03  -2.498 0.012600 *  
## KitchenAbvGr         -1.530e+04  5.860e+03  -2.611 0.009133 ** 
## KitchenQualFa        -1.367e+04  6.152e+03  -2.223 0.026399 *  
## KitchenQualGd        -1.545e+04  3.486e+03  -4.432 1.01e-05 ***
## KitchenQualTA        -1.472e+04  3.907e+03  -3.767 0.000173 ***
## TotRmsAbvGrd          1.064e+03  9.313e+02   1.142 0.253516    
## FunctionalMaj2        2.136e+03  1.312e+04   0.163 0.870692    
## FunctionalMin1        6.812e+03  8.352e+03   0.816 0.414884    
## FunctionalMin2        7.681e+03  8.377e+03   0.917 0.359377    
## FunctionalMod        -8.443e+02  1.020e+04  -0.083 0.934063    
## FunctionalSev        -5.485e+04  2.608e+04  -2.103 0.035648 *  
## FunctionalTyp         2.069e+04  7.262e+03   2.849 0.004456 ** 
## Fireplaces            3.624e+03  1.304e+03   2.778 0.005548 ** 
## GarageCars            2.885e+03  2.118e+03   1.362 0.173388    
## GarageArea            1.639e+01  7.295e+00   2.247 0.024836 *  
## PavedDriveP          -4.519e+03  5.345e+03  -0.845 0.398075    
## PavedDriveY          -2.406e+03  3.272e+03  -0.735 0.462323    
## WoodDeckSF            9.425e+00  5.665e+00   1.664 0.096401 .  
## OpenPorchSF           1.162e+01  1.124e+01   1.034 0.301423    
## EnclosedPorch         1.577e+01  1.224e+01   1.289 0.197777    
## X3SsnPorch            4.757e+01  2.187e+01   2.175 0.029836 *  
## ScreenPorch           4.155e+01  1.189e+01   3.494 0.000493 ***
## PoolArea              6.028e+01  1.760e+01   3.425 0.000635 ***
## MiscVal               1.469e-01  1.385e+00   0.106 0.915532    
## MoSold               -5.846e+02  2.420e+02  -2.416 0.015837 *  
## YrSold                1.340e+02  4.963e+02   0.270 0.787215    
## SaleTypeCon           3.478e+04  1.735e+04   2.005 0.045191 *  
## SaleTypeConLD         1.810e+04  9.810e+03   1.845 0.065288 .  
## SaleTypeConLI        -1.464e+03  1.133e+04  -0.129 0.897222    
## SaleTypeConLw        -3.958e+02  1.206e+04  -0.033 0.973817    
## SaleTypeCWD           1.341e+04  1.269e+04   1.057 0.290659    
## SaleTypeNew           3.566e+04  1.523e+04   2.341 0.019399 *  
## SaleTypeOth           1.250e+04  1.422e+04   0.879 0.379739    
## SaleTypeWD            5.130e+02  4.108e+03   0.125 0.900659    
## SaleConditionAdjLand  1.350e+04  1.370e+04   0.985 0.324676    
## SaleConditionAlloca   7.384e+03  8.418e+03   0.877 0.380524    
## SaleConditionFamily  -6.808e+02  5.981e+03  -0.114 0.909396    
## SaleConditionNormal   6.677e+03  2.814e+03   2.373 0.017803 *  
## SaleConditionPartial -7.078e+03  1.465e+04  -0.483 0.629070    
## OverallQual_factor10  4.813e+04  8.195e+03   5.873 5.47e-09 ***
## OverallQual_factor2  -1.347e+04  2.347e+04  -0.574 0.566172    
## OverallQual_factor3  -2.815e+04  1.693e+04  -1.663 0.096587 .  
## OverallQual_factor4  -3.554e+04  1.361e+04  -2.612 0.009118 ** 
## OverallQual_factor5  -4.258e+04  1.115e+04  -3.818 0.000141 ***
## OverallQual_factor6  -4.747e+04  8.890e+03  -5.340 1.10e-07 ***
## OverallQual_factor7  -4.804e+04  6.765e+03  -7.101 2.07e-12 ***
## OverallQual_factor8  -3.478e+04  5.260e+03  -6.612 5.59e-11 ***
## OverallQual_factor9          NA         NA      NA       NA    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 22580 on 1253 degrees of freedom
## Multiple R-squared:  0.9306, Adjusted R-squared:  0.9192 
## F-statistic: 81.59 on 206 and 1253 DF,  p-value: < 2.2e-16
step(lm1 ,data= house.train.df , direction = "backward" ,test = "F")
## Start:  AIC=29463.15
## SalePrice ~ Id + MSSubClass + MSZoning + LotArea + Street + LotShape + 
##     LandContour + Utilities + LotConfig + LandSlope + Neighborhood + 
##     Condition1 + Condition2 + BldgType + HouseStyle + OverallQual + 
##     OverallCond + YearBuilt + YearRemodAdd + RoofStyle + RoofMatl + 
##     Exterior1st + Exterior2nd + ExterQual + ExterCond + Foundation + 
##     BsmtFinSF1 + BsmtFinSF2 + BsmtUnfSF + TotalBsmtSF + Heating + 
##     HeatingQC + CentralAir + X1stFlrSF + X2ndFlrSF + LowQualFinSF + 
##     GrLivArea + BsmtFullBath + BsmtHalfBath + FullBath + HalfBath + 
##     BedroomAbvGr + KitchenAbvGr + KitchenQual + TotRmsAbvGrd + 
##     Functional + Fireplaces + GarageCars + GarageArea + PavedDrive + 
##     WoodDeckSF + OpenPorchSF + EnclosedPorch + X3SsnPorch + ScreenPorch + 
##     PoolArea + MiscVal + MoSold + YrSold + SaleType + SaleCondition + 
##     OverallQual_factor
## 
## 
## Step:  AIC=29463.15
## SalePrice ~ Id + MSSubClass + MSZoning + LotArea + Street + LotShape + 
##     LandContour + Utilities + LotConfig + LandSlope + Neighborhood + 
##     Condition1 + Condition2 + BldgType + HouseStyle + OverallQual + 
##     OverallCond + YearBuilt + YearRemodAdd + RoofStyle + RoofMatl + 
##     Exterior1st + Exterior2nd + ExterQual + ExterCond + Foundation + 
##     BsmtFinSF1 + BsmtFinSF2 + BsmtUnfSF + TotalBsmtSF + Heating + 
##     HeatingQC + CentralAir + X1stFlrSF + X2ndFlrSF + LowQualFinSF + 
##     BsmtFullBath + BsmtHalfBath + FullBath + HalfBath + BedroomAbvGr + 
##     KitchenAbvGr + KitchenQual + TotRmsAbvGrd + Functional + 
##     Fireplaces + GarageCars + GarageArea + PavedDrive + WoodDeckSF + 
##     OpenPorchSF + EnclosedPorch + X3SsnPorch + ScreenPorch + 
##     PoolArea + MiscVal + MoSold + YrSold + SaleType + SaleCondition + 
##     OverallQual_factor
## 
## 
## Step:  AIC=29463.15
## SalePrice ~ Id + MSSubClass + MSZoning + LotArea + Street + LotShape + 
##     LandContour + Utilities + LotConfig + LandSlope + Neighborhood + 
##     Condition1 + Condition2 + BldgType + HouseStyle + OverallQual + 
##     OverallCond + YearBuilt + YearRemodAdd + RoofStyle + RoofMatl + 
##     Exterior1st + Exterior2nd + ExterQual + ExterCond + Foundation + 
##     BsmtFinSF1 + BsmtFinSF2 + BsmtUnfSF + Heating + HeatingQC + 
##     CentralAir + X1stFlrSF + X2ndFlrSF + LowQualFinSF + BsmtFullBath + 
##     BsmtHalfBath + FullBath + HalfBath + BedroomAbvGr + KitchenAbvGr + 
##     KitchenQual + TotRmsAbvGrd + Functional + Fireplaces + GarageCars + 
##     GarageArea + PavedDrive + WoodDeckSF + OpenPorchSF + EnclosedPorch + 
##     X3SsnPorch + ScreenPorch + PoolArea + MiscVal + MoSold + 
##     YrSold + SaleType + SaleCondition + OverallQual_factor
## 
## 
## Step:  AIC=29463.15
## SalePrice ~ Id + MSSubClass + MSZoning + LotArea + Street + LotShape + 
##     LandContour + Utilities + LotConfig + LandSlope + Neighborhood + 
##     Condition1 + Condition2 + BldgType + HouseStyle + OverallCond + 
##     YearBuilt + YearRemodAdd + RoofStyle + RoofMatl + Exterior1st + 
##     Exterior2nd + ExterQual + ExterCond + Foundation + BsmtFinSF1 + 
##     BsmtFinSF2 + BsmtUnfSF + Heating + HeatingQC + CentralAir + 
##     X1stFlrSF + X2ndFlrSF + LowQualFinSF + BsmtFullBath + BsmtHalfBath + 
##     FullBath + HalfBath + BedroomAbvGr + KitchenAbvGr + KitchenQual + 
##     TotRmsAbvGrd + Functional + Fireplaces + GarageCars + GarageArea + 
##     PavedDrive + WoodDeckSF + OpenPorchSF + EnclosedPorch + X3SsnPorch + 
##     ScreenPorch + PoolArea + MiscVal + MoSold + YrSold + SaleType + 
##     SaleCondition + OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - MSSubClass         13 2.3424e+09 6.4115e+11 29443   0.3534 0.9828693    
## - Exterior2nd        14 5.8604e+09 6.4467e+11 29449   0.8211 0.6466102    
## - HouseStyle          7 2.8427e+09 6.4165e+11 29456   0.7965 0.5902124    
## - Heating             5 2.0884e+09 6.4090e+11 29458   0.8193 0.5358934    
## - BldgType            3 5.3967e+08 6.3935e+11 29458   0.3528 0.7870961    
## - ExterCond           4 1.4667e+09 6.4027e+11 29459   0.7192 0.5788148    
## - HeatingQC           4 1.8151e+09 6.4062e+11 29459   0.8901 0.4691059    
## - PavedDrive          2 4.3409e+08 6.3924e+11 29460   0.4257 0.6533899    
## - LotShape            3 1.3650e+09 6.4017e+11 29460   0.8925 0.4443708    
## - Exterior1st        13 1.0283e+10 6.4909e+11 29461   1.5515 0.0928339 .  
## - HalfBath            1 1.3361e+06 6.3881e+11 29461   0.0026 0.9591796    
## - MiscVal             1 5.7375e+06 6.3881e+11 29461   0.0113 0.9155321    
## - Id                  1 1.6869e+07 6.3882e+11 29461   0.0331 0.8556901    
## - YrSold              1 3.7162e+07 6.3884e+11 29461   0.0729 0.7872149    
## - CentralAir          1 4.8665e+07 6.3886e+11 29461   0.0955 0.7574050    
## - BsmtHalfBath        1 8.0660e+07 6.3889e+11 29461   0.1582 0.6908752    
## - ExterQual           3 2.0000e+09 6.4081e+11 29462   1.3076 0.2704190    
## - LowQualFinSF        1 4.8235e+08 6.3929e+11 29462   0.9461 0.3308974    
## - OpenPorchSF         1 5.4488e+08 6.3935e+11 29462   1.0688 0.3014234    
## - SaleCondition       5 4.1315e+09 6.4294e+11 29463   1.6208 0.1514827    
## - BsmtFullBath        1 6.2084e+08 6.3943e+11 29463   1.2178 0.2700133    
## - TotRmsAbvGrd        1 6.6533e+08 6.3947e+11 29463   1.3050 0.2535160    
## - EnclosedPorch       1 8.4655e+08 6.3965e+11 29463   1.6605 0.1977773    
## - SaleType            8 7.0245e+09 6.4583e+11 29463   1.7223 0.0889153 .  
## <none>                             6.3881e+11 29463                       
## - Utilities           1 8.9707e+08 6.3970e+11 29463   1.7596 0.1849196    
## - GarageCars          1 9.4598e+08 6.3975e+11 29463   1.8555 0.1733883    
## - YearRemodAdd        1 1.0613e+09 6.3987e+11 29464   2.0817 0.1493278    
## - FullBath            1 1.0713e+09 6.3988e+11 29464   2.1014 0.1474130    
## - WoodDeckSF          1 1.4113e+09 6.4022e+11 29464   2.7683 0.0964010 .  
## - RoofStyle           5 4.9807e+09 6.4379e+11 29465   1.9539 0.0828475 .  
## - X3SsnPorch          1 2.4112e+09 6.4122e+11 29467   4.7295 0.0298361 *  
## - GarageArea          1 2.5733e+09 6.4138e+11 29467   5.0474 0.0248361 *  
## - LandContour         3 4.4074e+09 6.4321e+11 29467   2.8817 0.0348127 *  
## - MoSold              1 2.9757e+09 6.4178e+11 29468   5.8367 0.0158373 *  
## - Foundation          5 6.6540e+09 6.4546e+11 29468   2.6103 0.0233822 *  
## - BedroomAbvGr        1 3.1825e+09 6.4199e+11 29468   6.2424 0.0126000 *  
## - Street              1 3.4617e+09 6.4227e+11 29469   6.7900 0.0092755 ** 
## - KitchenAbvGr        1 3.4759e+09 6.4228e+11 29469   6.8178 0.0091329 ** 
## - MSZoning            4 6.1794e+09 6.4499e+11 29469   3.0302 0.0168233 *  
## - LotConfig           4 6.1965e+09 6.4500e+11 29469   3.0386 0.0165849 *  
## - Fireplaces          1 3.9350e+09 6.4274e+11 29470   7.7183 0.0055479 ** 
## - PoolArea            1 5.9795e+09 6.4479e+11 29475  11.7286 0.0006354 ***
## - ScreenPorch         1 6.2228e+09 6.4503e+11 29475  12.2058 0.0004930 ***
## - BsmtUnfSF           1 7.3217e+09 6.4613e+11 29478  14.3613 0.0001580 ***
## - KitchenQual         3 1.0034e+10 6.4884e+11 29480   6.5602 0.0002118 ***
## - Condition1          8 1.4984e+10 6.5379e+11 29481   3.6737 0.0003021 ***
## - LandSlope           2 9.6911e+09 6.4850e+11 29481   9.5044 8.004e-05 ***
## - BsmtFinSF2          1 1.0117e+10 6.4892e+11 29484  19.8449 9.148e-06 ***
## - YearBuilt           1 1.3662e+10 6.5247e+11 29492  26.7970 2.630e-07 ***
## - Functional          6 1.9801e+10 6.5861e+11 29496   6.4732 9.768e-07 ***
## - LotArea             1 2.2054e+10 6.6086e+11 29511  43.2573 7.030e-11 ***
## - OverallCond         1 3.1507e+10 6.7031e+11 29531  61.7993 8.146e-15 ***
## - BsmtFinSF1          1 3.5434e+10 6.7424e+11 29540  69.5021 < 2.2e-16 ***
## - X1stFlrSF           1 5.5871e+10 6.9468e+11 29584 109.5898 < 2.2e-16 ***
## - Neighborhood       24 8.0485e+10 7.1929e+11 29588   6.5779 < 2.2e-16 ***
## - X2ndFlrSF           1 8.2451e+10 7.2126e+11 29638 161.7259 < 2.2e-16 ***
## - Condition2          7 9.9382e+10 7.3819e+11 29660  27.8477 < 2.2e-16 ***
## - OverallQual_factor  9 1.2424e+11 7.6305e+11 29705  27.0775 < 2.2e-16 ***
## - RoofMatl            7 2.6930e+11 9.0811e+11 29963  75.4605 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29442.49
## SalePrice ~ Id + MSZoning + LotArea + Street + LotShape + LandContour + 
##     Utilities + LotConfig + LandSlope + Neighborhood + Condition1 + 
##     Condition2 + BldgType + HouseStyle + OverallCond + YearBuilt + 
##     YearRemodAdd + RoofStyle + RoofMatl + Exterior1st + Exterior2nd + 
##     ExterQual + ExterCond + Foundation + BsmtFinSF1 + BsmtFinSF2 + 
##     BsmtUnfSF + Heating + HeatingQC + CentralAir + X1stFlrSF + 
##     X2ndFlrSF + LowQualFinSF + BsmtFullBath + BsmtHalfBath + 
##     FullBath + HalfBath + BedroomAbvGr + KitchenAbvGr + KitchenQual + 
##     TotRmsAbvGrd + Functional + Fireplaces + GarageCars + GarageArea + 
##     PavedDrive + WoodDeckSF + OpenPorchSF + EnclosedPorch + X3SsnPorch + 
##     ScreenPorch + PoolArea + MiscVal + MoSold + YrSold + SaleType + 
##     SaleCondition + OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - Exterior2nd        14 6.3542e+09 6.4750e+11 29429   0.8962 0.5626886    
## - Heating             5 2.2467e+09 6.4340e+11 29438   0.8873 0.4887903    
## - ExterCond           4 1.4709e+09 6.4262e+11 29438   0.7261 0.5741393    
## - HeatingQC           4 1.9664e+09 6.4312e+11 29439   0.9707 0.4225007    
## - PavedDrive          2 3.6088e+08 6.4151e+11 29439   0.3563 0.7003400    
## - HouseStyle          7 4.8220e+09 6.4597e+11 29439   1.3602 0.2184386    
## - LotShape            3 1.4090e+09 6.4256e+11 29440   0.9274 0.4267718    
## - Exterior1st        13 1.0454e+10 6.5160e+11 29440   1.5879 0.0819800 .  
## - HalfBath            1 4.0761e+05 6.4115e+11 29441   0.0008 0.9773714    
## - Id                  1 3.8139e+06 6.4115e+11 29441   0.0075 0.9308599    
## - MiscVal             1 5.1410e+06 6.4115e+11 29441   0.0102 0.9197622    
## - YrSold              1 1.9831e+07 6.4117e+11 29441   0.0392 0.8431665    
## - CentralAir          1 3.0394e+07 6.4118e+11 29441   0.0600 0.8065114    
## - BsmtHalfBath        1 5.9342e+07 6.4121e+11 29441   0.1172 0.7321759    
## - LowQualFinSF        1 4.3174e+08 6.4158e+11 29442   0.8525 0.3560188    
## - OpenPorchSF         1 5.0104e+08 6.4165e+11 29442   0.9894 0.3200913    
## - BsmtFullBath        1 6.1505e+08 6.4176e+11 29442   1.2145 0.2706605    
## - ExterQual           3 2.3799e+09 6.4353e+11 29442   1.5664 0.1957606    
## - TotRmsAbvGrd        1 6.5909e+08 6.4181e+11 29442   1.3014 0.2541693    
## - EnclosedPorch       1 6.7188e+08 6.4182e+11 29442   1.3267 0.2496147    
## - Utilities           1 7.4243e+08 6.4189e+11 29442   1.4660 0.2262070    
## <none>                             6.4115e+11 29443                       
## - SaleCondition       5 4.4450e+09 6.4559e+11 29443   1.7554 0.1191584    
## - GarageCars          1 9.6202e+08 6.4211e+11 29443   1.8996 0.1683688    
## - FullBath            1 9.8211e+08 6.4213e+11 29443   1.9393 0.1639933    
## - SaleType            8 7.2573e+09 6.4841e+11 29443   1.7913 0.0746715 .  
## - YearRemodAdd        1 1.2167e+09 6.4237e+11 29443   2.4025 0.1213899    
## - WoodDeckSF          1 1.3559e+09 6.4251e+11 29444   2.6773 0.1020377    
## - X3SsnPorch          1 2.4121e+09 6.4356e+11 29446   4.7628 0.0292644 *  
## - GarageArea          1 2.4871e+09 6.4364e+11 29446   4.9110 0.0268639 *  
## - RoofStyle           5 6.0305e+09 6.4718e+11 29446   2.3815 0.0366699 *  
## - Foundation          5 6.3882e+09 6.4754e+11 29447   2.5228 0.0277996 *  
## - LandContour         3 4.6181e+09 6.4577e+11 29447   3.0396 0.0281222 *  
## - MoSold              1 3.0553e+09 6.4420e+11 29447   6.0330 0.0141745 *  
## - MSZoning            4 5.8706e+09 6.4702e+11 29448   2.8980 0.0210453 *  
## - LotConfig           4 6.0393e+09 6.4719e+11 29448   2.9813 0.0182765 *  
## - BedroomAbvGr        1 3.5432e+09 6.4469e+11 29449   6.9964 0.0082685 ** 
## - Fireplaces          1 3.8594e+09 6.4501e+11 29449   7.6208 0.0058533 ** 
## - Street              1 3.8719e+09 6.4502e+11 29449   7.6453 0.0057746 ** 
## - KitchenAbvGr        1 4.6059e+09 6.4576e+11 29451   9.0947 0.0026145 ** 
## - PoolArea            1 5.3178e+09 6.4647e+11 29453  10.5005 0.0012245 ** 
## - ScreenPorch         1 6.0290e+09 6.4718e+11 29454  11.9046 0.0005784 ***
## - BsmtUnfSF           1 7.2941e+09 6.4844e+11 29457  14.4028 0.0001546 ***
## - KitchenQual         3 1.0255e+10 6.5140e+11 29460   6.7500 0.0001620 ***
## - LandSlope           2 9.4520e+09 6.5060e+11 29460   9.3319 9.480e-05 ***
## - Condition1          8 1.4939e+10 6.5609e+11 29460   3.6873 0.0002890 ***
## - BsmtFinSF2          1 1.0064e+10 6.5121e+11 29463  19.8715 9.016e-06 ***
## - BldgType            4 1.4050e+10 6.5520e+11 29466   6.9355 1.601e-05 ***
## - Functional          6 2.0008e+10 6.6116e+11 29475   6.5846 7.272e-07 ***
## - YearBuilt           1 1.6456e+10 6.5761e+11 29478  32.4945 1.486e-08 ***
## - LotArea             1 2.3093e+10 6.6424e+11 29492  45.5992 2.205e-11 ***
## - OverallCond         1 3.1465e+10 6.7261e+11 29510  62.1308 6.886e-15 ***
## - BsmtFinSF1          1 3.5732e+10 6.7688e+11 29520  70.5557 < 2.2e-16 ***
## - X1stFlrSF           1 5.7733e+10 6.9888e+11 29566 113.9975 < 2.2e-16 ***
## - Neighborhood       24 8.2738e+10 7.2389e+11 29572   6.8072 < 2.2e-16 ***
## - X2ndFlrSF           1 8.6044e+10 7.2719e+11 29624 169.9003 < 2.2e-16 ***
## - Condition2          7 1.0055e+11 7.4170e+11 29641  28.3639 < 2.2e-16 ***
## - OverallQual_factor  9 1.2598e+11 7.6713e+11 29686  27.6401 < 2.2e-16 ***
## - RoofMatl            7 2.7194e+11 9.1309e+11 29945  76.7089 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29428.89
## SalePrice ~ Id + MSZoning + LotArea + Street + LotShape + LandContour + 
##     Utilities + LotConfig + LandSlope + Neighborhood + Condition1 + 
##     Condition2 + BldgType + HouseStyle + OverallCond + YearBuilt + 
##     YearRemodAdd + RoofStyle + RoofMatl + Exterior1st + ExterQual + 
##     ExterCond + Foundation + BsmtFinSF1 + BsmtFinSF2 + BsmtUnfSF + 
##     Heating + HeatingQC + CentralAir + X1stFlrSF + X2ndFlrSF + 
##     LowQualFinSF + BsmtFullBath + BsmtHalfBath + FullBath + HalfBath + 
##     BedroomAbvGr + KitchenAbvGr + KitchenQual + TotRmsAbvGrd + 
##     Functional + Fireplaces + GarageCars + GarageArea + PavedDrive + 
##     WoodDeckSF + OpenPorchSF + EnclosedPorch + X3SsnPorch + ScreenPorch + 
##     PoolArea + MiscVal + MoSold + YrSold + SaleType + SaleCondition + 
##     OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - Heating             5 2.1342e+09 6.4964e+11 29424   0.8438 0.5186115    
## - ExterCond           4 1.3860e+09 6.4889e+11 29424   0.6850 0.6023763    
## - HeatingQC           4 1.6746e+09 6.4918e+11 29425   0.8276 0.5075545    
## - PavedDrive          2 3.6697e+08 6.4787e+11 29426   0.3627 0.6958542    
## - Exterior1st        14 1.1215e+10 6.5872e+11 29426   1.5836 0.0769246 .  
## - LotShape            3 1.3927e+09 6.4890e+11 29426   0.9177 0.4315878    
## - HouseStyle          7 5.3054e+09 6.5281e+11 29427   1.4982 0.1636982    
## - MiscVal             1 2.0938e+05 6.4750e+11 29427   0.0004 0.9837717    
## - HalfBath            1 2.2942e+06 6.4751e+11 29427   0.0045 0.9463181    
## - CentralAir          1 1.0958e+07 6.4751e+11 29427   0.0217 0.8830106    
## - YrSold              1 1.3404e+07 6.4752e+11 29427   0.0265 0.8707175    
## - BsmtHalfBath        1 3.6325e+07 6.4754e+11 29427   0.0718 0.7887652    
## - Id                  1 3.6997e+07 6.4754e+11 29427   0.0731 0.7868669    
## - ExterQual           3 1.9967e+09 6.4950e+11 29427   1.3157 0.2677392    
## - LowQualFinSF        1 4.9188e+08 6.4800e+11 29428   0.9724 0.3242794    
## - BsmtFullBath        1 5.0771e+08 6.4801e+11 29428   1.0037 0.3166164    
## - OpenPorchSF         1 5.6011e+08 6.4806e+11 29428   1.1072 0.2928827    
## - TotRmsAbvGrd        1 6.2268e+08 6.4813e+11 29428   1.2309 0.2674337    
## - GarageCars          1 7.0023e+08 6.4820e+11 29429   1.3842 0.2396021    
## - Utilities           1 7.0074e+08 6.4820e+11 29429   1.3852 0.2394303    
## - SaleCondition       5 4.2779e+09 6.5178e+11 29429   1.6913 0.1336559    
## - EnclosedPorch       1 7.7650e+08 6.4828e+11 29429   1.5350 0.2155905    
## - SaleType            8 7.0673e+09 6.5457e+11 29429   1.7464 0.0836713 .  
## - FullBath            1 8.8300e+08 6.4839e+11 29429   1.7455 0.1866759    
## <none>                             6.4750e+11 29429                       
## - YearRemodAdd        1 1.2297e+09 6.4873e+11 29430   2.4309 0.1192113    
## - WoodDeckSF          1 1.3353e+09 6.4884e+11 29430   2.6396 0.1044758    
## - RoofStyle           5 5.9634e+09 6.5347e+11 29432   2.3577 0.0384043 *  
## - X3SsnPorch          1 2.5590e+09 6.5006e+11 29433   5.0587 0.0246719 *  
## - Foundation          5 6.4674e+09 6.5397e+11 29433   2.5570 0.0259787 *  
## - MSZoning            4 5.6535e+09 6.5316e+11 29434   2.7940 0.0250752 *  
## - MoSold              1 3.0053e+09 6.5051e+11 29434   5.9409 0.0149286 *  
## - GarageArea          1 3.0500e+09 6.5055e+11 29434   6.0294 0.0142017 *  
## - LotConfig           4 5.9605e+09 6.5346e+11 29434   2.9457 0.0194094 *  
## - LandContour         3 5.1546e+09 6.5266e+11 29435   3.3966 0.0173067 *  
## - BedroomAbvGr        1 3.6973e+09 6.5120e+11 29435   7.3090 0.0069519 ** 
## - Street              1 3.7709e+09 6.5127e+11 29435   7.4543 0.0064152 ** 
## - Fireplaces          1 3.7938e+09 6.5130e+11 29435   7.4998 0.0062563 ** 
## - KitchenAbvGr        1 5.5803e+09 6.5308e+11 29439  11.0313 0.0009211 ***
## - ScreenPorch         1 5.8796e+09 6.5338e+11 29440  11.6228 0.0006717 ***
## - PoolArea            1 5.9730e+09 6.5348e+11 29440  11.8075 0.0006088 ***
## - BsmtUnfSF           1 7.5595e+09 6.5506e+11 29444  14.9437 0.0001163 ***
## - Condition1          8 1.4507e+10 6.6201e+11 29445   3.5847 0.0003994 ***
## - KitchenQual         3 1.0453e+10 6.5796e+11 29446   6.8880 0.0001333 ***
## - LandSlope           2 1.0468e+10 6.5797e+11 29448  10.3467 3.487e-05 ***
## - BsmtFinSF2          1 1.0326e+10 6.5783e+11 29450  20.4133 6.815e-06 ***
## - BldgType            4 1.4471e+10 6.6198e+11 29453   7.1518 1.077e-05 ***
## - Functional          6 1.9832e+10 6.6734e+11 29461   6.5342 8.280e-07 ***
## - YearBuilt           1 1.7399e+10 6.6490e+11 29466  34.3939 5.723e-09 ***
## - LotArea             1 2.3180e+10 6.7068e+11 29478  45.8221 1.967e-11 ***
## - OverallCond         1 3.3455e+10 6.8096e+11 29500  66.1348 9.862e-16 ***
## - BsmtFinSF1          1 3.7008e+10 6.8451e+11 29508  73.1590 < 2.2e-16 ***
## - X1stFlrSF           1 5.9065e+10 7.0657e+11 29554 116.7614 < 2.2e-16 ***
## - Neighborhood       24 8.2349e+10 7.2985e+11 29556   6.7829 < 2.2e-16 ***
## - X2ndFlrSF           1 8.9853e+10 7.3736e+11 29617 177.6233 < 2.2e-16 ***
## - Condition2          7 1.0210e+11 7.4960e+11 29629  28.8320 < 2.2e-16 ***
## - OverallQual_factor  9 1.2963e+11 7.7713e+11 29677  28.4722 < 2.2e-16 ***
## - RoofMatl            7 2.7774e+11 9.2524e+11 29936  78.4348 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29423.69
## SalePrice ~ Id + MSZoning + LotArea + Street + LotShape + LandContour + 
##     Utilities + LotConfig + LandSlope + Neighborhood + Condition1 + 
##     Condition2 + BldgType + HouseStyle + OverallCond + YearBuilt + 
##     YearRemodAdd + RoofStyle + RoofMatl + Exterior1st + ExterQual + 
##     ExterCond + Foundation + BsmtFinSF1 + BsmtFinSF2 + BsmtUnfSF + 
##     HeatingQC + CentralAir + X1stFlrSF + X2ndFlrSF + LowQualFinSF + 
##     BsmtFullBath + BsmtHalfBath + FullBath + HalfBath + BedroomAbvGr + 
##     KitchenAbvGr + KitchenQual + TotRmsAbvGrd + Functional + 
##     Fireplaces + GarageCars + GarageArea + PavedDrive + WoodDeckSF + 
##     OpenPorchSF + EnclosedPorch + X3SsnPorch + ScreenPorch + 
##     PoolArea + MiscVal + MoSold + YrSold + SaleType + SaleCondition + 
##     OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - ExterCond           4 1.5303e+09 6.5117e+11 29419   0.7568 0.5535132    
## - HeatingQC           4 1.8153e+09 6.5145e+11 29420   0.8977 0.4645550    
## - HouseStyle          7 4.7711e+09 6.5441e+11 29420   1.3482 0.2238172    
## - PavedDrive          2 5.0393e+08 6.5014e+11 29421   0.4984 0.6076229    
## - LotShape            3 1.4278e+09 6.5107e+11 29421   0.9414 0.4198576    
## - MiscVal             1 9.5716e+04 6.4964e+11 29422   0.0002 0.9890239    
## - HalfBath            1 2.4067e+06 6.4964e+11 29422   0.0048 0.9450033    
## - YrSold              1 7.0984e+06 6.4965e+11 29422   0.0140 0.9056952    
## - CentralAir          1 8.7062e+06 6.4965e+11 29422   0.0172 0.8956145    
## - BsmtHalfBath        1 4.2073e+07 6.4968e+11 29422   0.0832 0.7730240    
## - Id                  1 7.2054e+07 6.4971e+11 29422   0.1425 0.7058460    
## - Exterior1st        14 1.1754e+10 6.6139e+11 29422   1.6607 0.0578806 .  
## - ExterQual           3 1.9920e+09 6.5163e+11 29422   1.3134 0.2684995    
## - LowQualFinSF        1 3.1665e+08 6.4995e+11 29422   0.6263 0.4288476    
## - BsmtFullBath        1 5.4748e+08 6.5019e+11 29423   1.0829 0.2982391    
## - OpenPorchSF         1 6.2733e+08 6.5027e+11 29423   1.2409 0.2655104    
## - SaleType            8 6.9669e+09 6.5661e+11 29423   1.7226 0.0888177 .  
## - Utilities           1 7.3067e+08 6.5037e+11 29423   1.4453 0.2295079    
## - TotRmsAbvGrd        1 7.5077e+08 6.5039e+11 29423   1.4850 0.2232104    
## - GarageCars          1 7.6959e+08 6.5041e+11 29423   1.5223 0.2175016    
## - SaleCondition       5 4.3503e+09 6.5399e+11 29423   1.7210 0.1267422    
## - EnclosedPorch       1 8.2268e+08 6.5046e+11 29424   1.6273 0.2023091    
## <none>                             6.4964e+11 29424                       
## - FullBath            1 9.4675e+08 6.5058e+11 29424   1.8727 0.1714067    
## - YearRemodAdd        1 1.1319e+09 6.5077e+11 29424   2.2389 0.1348256    
## - WoodDeckSF          1 1.4216e+09 6.5106e+11 29425   2.8120 0.0938023 .  
## - RoofStyle           5 5.9601e+09 6.5560e+11 29427   2.3578 0.0383925 *  
## - X3SsnPorch          1 2.5420e+09 6.5218e+11 29427   5.0281 0.0251088 *  
## - MSZoning            4 5.6838e+09 6.5532e+11 29428   2.8107 0.0243793 *  
## - GarageArea          1 3.0874e+09 6.5273e+11 29429   6.1070 0.0135939 *  
## - Foundation          5 6.6844e+09 6.5632e+11 29429   2.6444 0.0218389 *  
## - MoSold              1 3.1273e+09 6.5277e+11 29429   6.1859 0.0130032 *  
## - LandContour         3 4.9594e+09 6.5460e+11 29429   3.2700 0.0205654 *  
## - LotConfig           4 6.0964e+09 6.5573e+11 29429   3.0147 0.0172627 *  
## - Street              1 3.7004e+09 6.5334e+11 29430   7.3195 0.0069112 ** 
## - BedroomAbvGr        1 3.8750e+09 6.5351e+11 29430   7.6648 0.0057117 ** 
## - Fireplaces          1 3.9472e+09 6.5359e+11 29431   7.8076 0.0052801 ** 
## - KitchenAbvGr        1 4.8685e+09 6.5451e+11 29433   9.6299 0.0019561 ** 
## - ScreenPorch         1 5.9027e+09 6.5554e+11 29435  11.6757 0.0006530 ***
## - PoolArea            1 6.3965e+09 6.5603e+11 29436  12.6525 0.0003887 ***
## - BsmtUnfSF           1 8.0633e+09 6.5770e+11 29440  15.9495 6.874e-05 ***
## - Condition1          8 1.4824e+10 6.6446e+11 29441   3.6653 0.0003094 ***
## - KitchenQual         3 1.0519e+10 6.6016e+11 29441   6.9355 0.0001246 ***
## - LandSlope           2 1.0344e+10 6.5998e+11 29443  10.2304 3.908e-05 ***
## - BsmtFinSF2          1 1.0444e+10 6.6008e+11 29445  20.6580 6.008e-06 ***
## - BldgType            4 1.4724e+10 6.6436e+11 29448   7.2809 8.501e-06 ***
## - Functional          6 1.9562e+10 6.6920e+11 29455   6.4489 1.035e-06 ***
## - YearBuilt           1 1.8294e+10 6.6793e+11 29462  36.1860 2.335e-09 ***
## - LotArea             1 2.2953e+10 6.7259e+11 29472  45.4006 2.417e-11 ***
## - OverallCond         1 3.4570e+10 6.8421e+11 29497  68.3797 3.332e-16 ***
## - BsmtFinSF1          1 3.7830e+10 6.8747e+11 29504  74.8279 < 2.2e-16 ***
## - X1stFlrSF           1 5.7936e+10 7.0757e+11 29546 114.5992 < 2.2e-16 ***
## - Neighborhood       24 8.4258e+10 7.3390e+11 29554   6.9444 < 2.2e-16 ***
## - X2ndFlrSF           1 8.8008e+10 7.3765e+11 29607 174.0815 < 2.2e-16 ***
## - Condition2          7 1.0200e+11 7.5163e+11 29623  28.8213 < 2.2e-16 ***
## - OverallQual_factor  9 1.2972e+11 7.7936e+11 29672  28.5108 < 2.2e-16 ***
## - RoofMatl            7 2.7951e+11 9.2915e+11 29932  78.9821 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29419.13
## SalePrice ~ Id + MSZoning + LotArea + Street + LotShape + LandContour + 
##     Utilities + LotConfig + LandSlope + Neighborhood + Condition1 + 
##     Condition2 + BldgType + HouseStyle + OverallCond + YearBuilt + 
##     YearRemodAdd + RoofStyle + RoofMatl + Exterior1st + ExterQual + 
##     Foundation + BsmtFinSF1 + BsmtFinSF2 + BsmtUnfSF + HeatingQC + 
##     CentralAir + X1stFlrSF + X2ndFlrSF + LowQualFinSF + BsmtFullBath + 
##     BsmtHalfBath + FullBath + HalfBath + BedroomAbvGr + KitchenAbvGr + 
##     KitchenQual + TotRmsAbvGrd + Functional + Fireplaces + GarageCars + 
##     GarageArea + PavedDrive + WoodDeckSF + OpenPorchSF + EnclosedPorch + 
##     X3SsnPorch + ScreenPorch + PoolArea + MiscVal + MoSold + 
##     YrSold + SaleType + SaleCondition + OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - HeatingQC           4 1.7186e+09 6.5289e+11 29415   0.8505 0.4932225    
## - HouseStyle          7 4.5028e+09 6.5567e+11 29415   1.2733 0.2599207    
## - LotShape            3 1.4388e+09 6.5261e+11 29416   0.9494 0.4159606    
## - PavedDrive          2 5.8689e+08 6.5176e+11 29416   0.5809 0.5595508    
## - Exterior1st        14 1.1671e+10 6.6284e+11 29417   1.6503 0.0601831 .  
## - YrSold              1 5.0564e+06 6.5117e+11 29417   0.0100 0.9203229    
## - HalfBath            1 5.1289e+06 6.5117e+11 29417   0.0102 0.9197562    
## - MiscVal             1 5.4535e+06 6.5117e+11 29417   0.0108 0.9172646    
## - CentralAir          1 1.9040e+07 6.5119e+11 29417   0.0377 0.8460963    
## - BsmtHalfBath        1 2.4604e+07 6.5119e+11 29417   0.0487 0.8253698    
## - Id                  1 7.2487e+07 6.5124e+11 29417   0.1435 0.7048984    
## - ExterQual           3 2.0023e+09 6.5317e+11 29418   1.3212 0.2659182    
## - LowQualFinSF        1 2.9760e+08 6.5147e+11 29418   0.5891 0.4429024    
## - BsmtFullBath        1 4.9242e+08 6.5166e+11 29418   0.9748 0.3236828    
## - OpenPorchSF         1 6.1114e+08 6.5178e+11 29419   1.2098 0.2715828    
## - Utilities           1 6.8101e+08 6.5185e+11 29419   1.3481 0.2458305    
## - TotRmsAbvGrd        1 7.5039e+08 6.5192e+11 29419   1.4854 0.2231540    
## - SaleCondition       5 4.3397e+09 6.5551e+11 29419   1.7181 0.1273998    
## - SaleType            8 7.1170e+09 6.5829e+11 29419   1.7610 0.0806184 .  
## - EnclosedPorch       1 8.4349e+08 6.5201e+11 29419   1.6697 0.1965309    
## - FullBath            1 8.8320e+08 6.5205e+11 29419   1.7483 0.1863248    
## <none>                             6.5117e+11 29419                       
## - GarageCars          1 8.9600e+08 6.5206e+11 29419   1.7736 0.1831666    
## - YearRemodAdd        1 1.1053e+09 6.5227e+11 29420   2.1880 0.1393356    
## - WoodDeckSF          1 1.2996e+09 6.5247e+11 29420   2.5726 0.1089773    
## - X3SsnPorch          1 2.5568e+09 6.5373e+11 29423   5.0611 0.0246363 *  
## - RoofStyle           5 6.1527e+09 6.5732e+11 29423   2.4359 0.0329680 *  
## - Foundation          5 6.4945e+09 6.5766e+11 29424   2.5712 0.0252538 *  
## - GarageArea          1 2.9123e+09 6.5408e+11 29424   5.7649 0.0164908 *  
## - MSZoning            4 5.6922e+09 6.5686e+11 29424   2.8170 0.0241213 *  
## - MoSold              1 3.1285e+09 6.5430e+11 29424   6.1929 0.0129516 *  
## - LotConfig           4 5.9972e+09 6.5717e+11 29425   2.9679 0.0186896 *  
## - LandContour         3 5.1642e+09 6.5633e+11 29425   3.4076 0.0170472 *  
## - Street              1 3.9777e+09 6.5515e+11 29426   7.8740 0.0050906 ** 
## - Fireplaces          1 4.0166e+09 6.5519e+11 29426   7.9509 0.0048798 ** 
## - BedroomAbvGr        1 4.1021e+09 6.5527e+11 29426   8.1202 0.0044472 ** 
## - KitchenAbvGr        1 4.9537e+09 6.5612e+11 29428   9.8060 0.0017786 ** 
## - ScreenPorch         1 5.8663e+09 6.5703e+11 29430  11.6125 0.0006753 ***
## - PoolArea            1 6.3861e+09 6.5755e+11 29431  12.6415 0.0003909 ***
## - BsmtUnfSF           1 8.3306e+09 6.5950e+11 29436  16.4906 5.184e-05 ***
## - KitchenQual         3 1.0671e+10 6.6184e+11 29437   7.0413 0.0001073 ***
## - Condition1          8 1.5311e+10 6.6648e+11 29437   3.7887 0.0002090 ***
## - LandSlope           2 1.0400e+10 6.6157e+11 29438  10.2935 3.672e-05 ***
## - BsmtFinSF2          1 1.0474e+10 6.6164e+11 29440  20.7335 5.777e-06 ***
## - BldgType            4 1.4803e+10 6.6597e+11 29444   7.3257 7.828e-06 ***
## - Functional          6 1.9566e+10 6.7073e+11 29450   6.4551 1.018e-06 ***
## - YearBuilt           1 1.8874e+10 6.7004e+11 29459  37.3605 1.299e-09 ***
## - LotArea             1 2.2918e+10 6.7409e+11 29468  45.3672 2.454e-11 ***
## - OverallCond         1 3.4448e+10 6.8562e+11 29492  68.1909 3.639e-16 ***
## - BsmtFinSF1          1 3.8198e+10 6.8937e+11 29500  75.6134 < 2.2e-16 ***
## - X1stFlrSF           1 5.7820e+10 7.0899e+11 29541 114.4566 < 2.2e-16 ***
## - Neighborhood       24 8.4882e+10 7.3605e+11 29550   7.0011 < 2.2e-16 ***
## - X2ndFlrSF           1 8.7605e+10 7.3877e+11 29601 173.4154 < 2.2e-16 ***
## - Condition2          7 1.0146e+11 7.5263e+11 29617  28.6910 < 2.2e-16 ***
## - OverallQual_factor  9 1.2977e+11 7.8094e+11 29667  28.5435 < 2.2e-16 ***
## - RoofMatl            7 2.7896e+11 9.3013e+11 29926  78.8869 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29414.98
## SalePrice ~ Id + MSZoning + LotArea + Street + LotShape + LandContour + 
##     Utilities + LotConfig + LandSlope + Neighborhood + Condition1 + 
##     Condition2 + BldgType + HouseStyle + OverallCond + YearBuilt + 
##     YearRemodAdd + RoofStyle + RoofMatl + Exterior1st + ExterQual + 
##     Foundation + BsmtFinSF1 + BsmtFinSF2 + BsmtUnfSF + CentralAir + 
##     X1stFlrSF + X2ndFlrSF + LowQualFinSF + BsmtFullBath + BsmtHalfBath + 
##     FullBath + HalfBath + BedroomAbvGr + KitchenAbvGr + KitchenQual + 
##     TotRmsAbvGrd + Functional + Fireplaces + GarageCars + GarageArea + 
##     PavedDrive + WoodDeckSF + OpenPorchSF + EnclosedPorch + X3SsnPorch + 
##     ScreenPorch + PoolArea + MiscVal + MoSold + YrSold + SaleType + 
##     SaleCondition + OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - HouseStyle          7 4.7110e+09 6.5760e+11 29412   1.3328 0.2308771    
## - LotShape            3 1.4657e+09 6.5435e+11 29412   0.9676 0.4072165    
## - PavedDrive          2 6.9355e+08 6.5358e+11 29413   0.6868 0.5033840    
## - HalfBath            1 1.9013e+06 6.5289e+11 29413   0.0038 0.9510800    
## - MiscVal             1 9.8738e+06 6.5290e+11 29413   0.0196 0.8888103    
## - YrSold              1 1.0652e+07 6.5290e+11 29413   0.0211 0.8845437    
## - BsmtHalfBath        1 3.0498e+07 6.5292e+11 29413   0.0604 0.8059039    
## - Id                  1 6.6117e+07 6.5295e+11 29413   0.1309 0.7175187    
## - CentralAir          1 7.4298e+07 6.5296e+11 29413   0.1471 0.7013440    
## - ExterQual           3 1.9115e+09 6.5480e+11 29413   1.2618 0.2860520    
## - LowQualFinSF        1 3.2800e+08 6.5322e+11 29414   0.6496 0.4204105    
## - SaleCondition       5 4.0358e+09 6.5692e+11 29414   1.5985 0.1574928    
## - BsmtFullBath        1 5.8420e+08 6.5347e+11 29414   1.1570 0.2822943    
## - OpenPorchSF         1 6.0131e+08 6.5349e+11 29414   1.1909 0.2753595    
## - SaleType            8 6.9311e+09 6.5982e+11 29414   1.7158 0.0903277 .  
## - Exterior1st        14 1.2417e+10 6.6530e+11 29415   1.7565 0.0401463 *  
## - Utilities           1 6.8060e+08 6.5357e+11 29415   1.3479 0.2458630    
## - TotRmsAbvGrd        1 8.2711e+08 6.5371e+11 29415   1.6380 0.2008252    
## - EnclosedPorch       1 8.9057e+08 6.5378e+11 29415   1.7637 0.1843970    
## - FullBath            1 8.9209e+08 6.5378e+11 29415   1.7667 0.1840224    
## <none>                             6.5289e+11 29415                       
## - GarageCars          1 9.0535e+08 6.5379e+11 29415   1.7930 0.1807983    
## - WoodDeckSF          1 1.2008e+09 6.5409e+11 29416   2.3782 0.1232842    
## - YearRemodAdd        1 1.2953e+09 6.5418e+11 29416   2.5653 0.1094784    
## - RoofStyle           5 6.1755e+09 6.5906e+11 29419   2.4460 0.0323171 *  
## - X3SsnPorch          1 2.7700e+09 6.5566e+11 29419   5.4859 0.0193216 *  
## - GarageArea          1 2.8743e+09 6.5576e+11 29419   5.6923 0.0171825 *  
## - Foundation          5 6.5247e+09 6.5941e+11 29420   2.5843 0.0246037 *  
## - MSZoning            4 5.7520e+09 6.5864e+11 29420   2.8479 0.0228957 *  
## - MoSold              1 3.0883e+09 6.5598e+11 29420   6.1161 0.0135230 *  
## - LotConfig           4 5.8683e+09 6.5876e+11 29420   2.9054 0.0207743 *  
## - LandContour         3 5.3958e+09 6.5828e+11 29421   3.5620 0.0138015 *  
## - Street              1 3.8848e+09 6.5677e+11 29422   7.6935 0.0056216 ** 
## - BedroomAbvGr        1 4.3459e+09 6.5723e+11 29423   8.6068 0.0034082 ** 
## - Fireplaces          1 4.3624e+09 6.5725e+11 29423   8.6394 0.0033481 ** 
## - KitchenAbvGr        1 5.1618e+09 6.5805e+11 29425  10.2227 0.0014208 ** 
## - ScreenPorch         1 5.6455e+09 6.5853e+11 29426  11.1805 0.0008503 ***
## - PoolArea            1 6.0040e+09 6.5889e+11 29426  11.8905 0.0005823 ***
## - BsmtUnfSF           1 8.5266e+09 6.6141e+11 29432  16.8863 4.218e-05 ***
## - Condition1          8 1.5063e+10 6.6795e+11 29432   3.7289 0.0002527 ***
## - KitchenQual         3 1.0596e+10 6.6348e+11 29433   6.9948 0.0001145 ***
## - LandSlope           2 1.0415e+10 6.6330e+11 29434  10.3132 3.601e-05 ***
## - BsmtFinSF2          1 1.0561e+10 6.6345e+11 29436  20.9146 5.263e-06 ***
## - BldgType            4 1.4527e+10 6.6741e+11 29439   7.1926 9.982e-06 ***
## - Functional          6 1.9566e+10 6.7245e+11 29446   6.4582 1.009e-06 ***
## - YearBuilt           1 2.0403e+10 6.7329e+11 29458  40.4070 2.852e-10 ***
## - LotArea             1 2.2893e+10 6.7578e+11 29463  45.3379 2.487e-11 ***
## - OverallCond         1 3.6446e+10 6.8933e+11 29492  72.1791 < 2.2e-16 ***
## - BsmtFinSF1          1 3.8059e+10 6.9095e+11 29496  75.3735 < 2.2e-16 ***
## - X1stFlrSF           1 5.8213e+10 7.1110e+11 29538 115.2876 < 2.2e-16 ***
## - Neighborhood       24 8.4573e+10 7.3746e+11 29545   6.9788 < 2.2e-16 ***
## - X2ndFlrSF           1 8.9476e+10 7.4236e+11 29601 177.2009 < 2.2e-16 ***
## - Condition2          7 1.0156e+11 7.5445e+11 29612  28.7345 < 2.2e-16 ***
## - OverallQual_factor  9 1.3075e+11 7.8364e+11 29664  28.7715 < 2.2e-16 ***
## - RoofMatl            7 2.7895e+11 9.3183e+11 29920  78.9196 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29411.48
## SalePrice ~ Id + MSZoning + LotArea + Street + LotShape + LandContour + 
##     Utilities + LotConfig + LandSlope + Neighborhood + Condition1 + 
##     Condition2 + BldgType + OverallCond + YearBuilt + YearRemodAdd + 
##     RoofStyle + RoofMatl + Exterior1st + ExterQual + Foundation + 
##     BsmtFinSF1 + BsmtFinSF2 + BsmtUnfSF + CentralAir + X1stFlrSF + 
##     X2ndFlrSF + LowQualFinSF + BsmtFullBath + BsmtHalfBath + 
##     FullBath + HalfBath + BedroomAbvGr + KitchenAbvGr + KitchenQual + 
##     TotRmsAbvGrd + Functional + Fireplaces + GarageCars + GarageArea + 
##     PavedDrive + WoodDeckSF + OpenPorchSF + EnclosedPorch + X3SsnPorch + 
##     ScreenPorch + PoolArea + MiscVal + MoSold + YrSold + SaleType + 
##     SaleCondition + OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - LotShape            3 1.4321e+09 6.5903e+11 29409   0.9437 0.4187244    
## - PavedDrive          2 7.1896e+08 6.5832e+11 29409   0.7107 0.4915136    
## - MiscVal             1 8.6215e+06 6.5761e+11 29410   0.0170 0.8961498    
## - YrSold              1 1.0770e+07 6.5761e+11 29410   0.0213 0.8840103    
## - LowQualFinSF        1 3.3976e+07 6.5763e+11 29410   0.0672 0.7955470    
## - Id                  1 6.7875e+07 6.5767e+11 29410   0.1342 0.7141951    
## - BsmtHalfBath        1 7.1659e+07 6.5767e+11 29410   0.1417 0.7066963    
## - CentralAir          1 8.5670e+07 6.5768e+11 29410   0.1694 0.6807490    
## - HalfBath            1 1.0021e+08 6.5770e+11 29410   0.1981 0.6563353    
## - ExterQual           3 2.0600e+09 6.5966e+11 29410   1.3575 0.2542476    
## - OpenPorchSF         1 4.9871e+08 6.5810e+11 29411   0.9859 0.3209340    
## - TotRmsAbvGrd        1 5.8013e+08 6.5818e+11 29411   1.1468 0.2844093    
## - Utilities           1 6.2804e+08 6.5823e+11 29411   1.2416 0.2653750    
## - SaleCondition       5 4.2721e+09 6.6187e+11 29411   1.6891 0.1341765    
## - BsmtFullBath        1 6.8226e+08 6.5828e+11 29411   1.3488 0.2457095    
## - Exterior1st        14 1.2630e+10 6.7023e+11 29411   1.7834 0.0361362 *  
## <none>                             6.5760e+11 29412                       
## - GarageCars          1 9.3013e+08 6.5853e+11 29412   1.8388 0.1753303    
## - FullBath            1 9.4287e+08 6.5854e+11 29412   1.8640 0.1724052    
## - YearRemodAdd        1 1.0343e+09 6.5863e+11 29412   2.0447 0.1529780    
## - EnclosedPorch       1 1.0517e+09 6.5865e+11 29412   2.0791 0.1495688    
## - WoodDeckSF          1 1.1548e+09 6.5875e+11 29412   2.2828 0.1310572    
## - SaleType            8 7.6890e+09 6.6529e+11 29412   1.9000 0.0563517 .  
## - Foundation          5 6.0179e+09 6.6362e+11 29415   2.3794 0.0368097 *  
## - RoofStyle           5 6.2695e+09 6.6387e+11 29415   2.4788 0.0302998 *  
## - X3SsnPorch          1 2.6479e+09 6.6025e+11 29415   5.2346 0.0223018 *  
## - GarageArea          1 2.7943e+09 6.6039e+11 29416   5.5241 0.0189055 *  
## - LotConfig           4 5.6555e+09 6.6325e+11 29416   2.7951 0.0250237 *  
## - MoSold              1 3.0367e+09 6.6063e+11 29416   6.0033 0.0144101 *  
## - MSZoning            4 5.9866e+09 6.6358e+11 29417   2.9587 0.0189806 *  
## - LandContour         3 5.2945e+09 6.6289e+11 29417   3.4889 0.0152528 *  
## - Street              1 4.0221e+09 6.6162e+11 29418   7.9512 0.0048784 ** 
## - Fireplaces          1 4.2495e+09 6.6185e+11 29419   8.4008 0.0038135 ** 
## - BedroomAbvGr        1 4.9635e+09 6.6256e+11 29421   9.8124 0.0017721 ** 
## - KitchenAbvGr        1 5.3691e+09 6.6297e+11 29421  10.6142 0.0011512 ** 
## - ScreenPorch         1 5.9687e+09 6.6357e+11 29423  11.7995 0.0006111 ***
## - PoolArea            1 7.5227e+09 6.6512e+11 29426  14.8715 0.0001207 ***
## - BsmtUnfSF           1 7.8226e+09 6.6542e+11 29427  15.4644 8.851e-05 ***
## - Condition1          8 1.5019e+10 6.7262e+11 29428   3.7114 0.0002670 ***
## - KitchenQual         3 1.0967e+10 6.6856e+11 29430   7.2268 8.248e-05 ***
## - LandSlope           2 1.0404e+10 6.6800e+11 29430  10.2837 3.705e-05 ***
## - BsmtFinSF2          1 9.8633e+09 6.6746e+11 29431  19.4986 1.090e-05 ***
## - BldgType            4 1.6219e+10 6.7382e+11 29439   8.0156 2.206e-06 ***
## - Functional          6 2.0608e+10 6.7821e+11 29445   6.7899 4.207e-07 ***
## - LotArea             1 2.2687e+10 6.8028e+11 29459  44.8490 3.159e-11 ***
## - YearBuilt           1 2.2992e+10 6.8059e+11 29460  45.4520 2.346e-11 ***
## - BsmtFinSF1          1 3.7506e+10 6.9510e+11 29491  74.1462 < 2.2e-16 ***
## - OverallCond         1 3.7720e+10 6.9532e+11 29491  74.5687 < 2.2e-16 ***
## - Neighborhood       24 8.4962e+10 7.4256e+11 29541   6.9984 < 2.2e-16 ***
## - X1stFlrSF           1 6.9697e+10 7.2729e+11 29557 137.7828 < 2.2e-16 ***
## - Condition2          7 1.0078e+11 7.5838e+11 29606  28.4611 < 2.2e-16 ***
## - X2ndFlrSF           1 1.2014e+11 7.7774e+11 29655 237.4997 < 2.2e-16 ***
## - OverallQual_factor  9 1.3174e+11 7.8934e+11 29660  28.9372 < 2.2e-16 ***
## - RoofMatl            7 2.9549e+11 9.5309e+11 29939  83.4499 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29408.65
## SalePrice ~ Id + MSZoning + LotArea + Street + LandContour + 
##     Utilities + LotConfig + LandSlope + Neighborhood + Condition1 + 
##     Condition2 + BldgType + OverallCond + YearBuilt + YearRemodAdd + 
##     RoofStyle + RoofMatl + Exterior1st + ExterQual + Foundation + 
##     BsmtFinSF1 + BsmtFinSF2 + BsmtUnfSF + CentralAir + X1stFlrSF + 
##     X2ndFlrSF + LowQualFinSF + BsmtFullBath + BsmtHalfBath + 
##     FullBath + HalfBath + BedroomAbvGr + KitchenAbvGr + KitchenQual + 
##     TotRmsAbvGrd + Functional + Fireplaces + GarageCars + GarageArea + 
##     PavedDrive + WoodDeckSF + OpenPorchSF + EnclosedPorch + X3SsnPorch + 
##     ScreenPorch + PoolArea + MiscVal + MoSold + YrSold + SaleType + 
##     SaleCondition + OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - PavedDrive          2 6.8000e+08 6.5971e+11 29406   0.6722 0.5107459    
## - YrSold              1 8.0507e+06 6.5904e+11 29407   0.0159 0.8996212    
## - MiscVal             1 1.8170e+07 6.5905e+11 29407   0.0359 0.8497019    
## - LowQualFinSF        1 4.5781e+07 6.5908e+11 29407   0.0905 0.7635695    
## - Id                  1 6.9191e+07 6.5910e+11 29407   0.1368 0.7115418    
## - CentralAir          1 7.3247e+07 6.5910e+11 29407   0.1448 0.7035972    
## - HalfBath            1 1.1120e+08 6.5914e+11 29407   0.2199 0.6392286    
## - BsmtHalfBath        1 1.1482e+08 6.5914e+11 29407   0.2270 0.6338226    
## - OpenPorchSF         1 4.7719e+08 6.5951e+11 29408   0.9435 0.3315670    
## - SaleCondition       5 4.1368e+09 6.6317e+11 29408   1.6358 0.1474803    
## - TotRmsAbvGrd        1 5.3010e+08 6.5956e+11 29408   1.0481 0.3061365    
## - ExterQual           3 2.4100e+09 6.6144e+11 29408   1.5883 0.1903887    
## - BsmtFullBath        1 6.0368e+08 6.5963e+11 29408   1.1936 0.2748127    
## - Utilities           1 6.6485e+08 6.5969e+11 29408   1.3145 0.2517892    
## - Exterior1st        14 1.2750e+10 6.7178e+11 29409   1.8007 0.0337517 *  
## <none>                             6.5903e+11 29409                       
## - EnclosedPorch       1 9.4250e+08 6.5997e+11 29409   1.8635 0.1724606    
## - FullBath            1 9.6530e+08 6.6000e+11 29409   1.9085 0.1673622    
## - GarageCars          1 1.0048e+09 6.6003e+11 29409   1.9866 0.1589339    
## - WoodDeckSF          1 1.0778e+09 6.6011e+11 29409   2.1310 0.1445875    
## - YearRemodAdd        1 1.2058e+09 6.6024e+11 29409   2.3840 0.1228252    
## - SaleType            8 7.6768e+09 6.6671e+11 29410   1.8973 0.0567557 .  
## - Foundation          5 5.9027e+09 6.6493e+11 29412   2.3341 0.0401941 *  
## - X3SsnPorch          1 2.5090e+09 6.6154e+11 29412   4.9606 0.0261010 *  
## - GarageArea          1 2.6893e+09 6.6172e+11 29413   5.3171 0.0212738 *  
## - RoofStyle           5 6.3448e+09 6.6537e+11 29413   2.5089 0.0285546 *  
## - MoSold              1 3.0697e+09 6.6210e+11 29413   6.0693 0.0138834 *  
## - LandContour         3 5.0249e+09 6.6406e+11 29414   3.3117 0.0194260 *  
## - MSZoning            4 6.0605e+09 6.6509e+11 29414   2.9956 0.0178269 *  
## - LotConfig           4 6.2526e+09 6.6528e+11 29414   3.0906 0.0151660 *  
## - Street              1 4.2064e+09 6.6324e+11 29416   8.3166 0.0039931 ** 
## - Fireplaces          1 4.2088e+09 6.6324e+11 29416   8.3214 0.0039826 ** 
## - BedroomAbvGr        1 5.0444e+09 6.6407e+11 29418   9.9735 0.0016246 ** 
## - KitchenAbvGr        1 5.4011e+09 6.6443e+11 29419  10.6788 0.0011120 ** 
## - ScreenPorch         1 6.2484e+09 6.6528e+11 29420  12.3541 0.0004551 ***
## - PoolArea            1 7.4057e+09 6.6644e+11 29423  14.6422 0.0001361 ***
## - BsmtUnfSF           1 7.6420e+09 6.6667e+11 29424  15.1093 0.0001066 ***
## - Condition1          8 1.4575e+10 6.7360e+11 29425   3.6021 0.0003775 ***
## - KitchenQual         3 1.1024e+10 6.7005e+11 29427   7.2655 7.808e-05 ***
## - LandSlope           2 1.0607e+10 6.6964e+11 29428  10.4857 3.037e-05 ***
## - BsmtFinSF2          1 1.0112e+10 6.6914e+11 29429  19.9931 8.448e-06 ***
## - BldgType            4 1.6331e+10 6.7536e+11 29436   8.0723 1.986e-06 ***
## - Functional          6 2.1120e+10 6.8015e+11 29443   6.9594 2.688e-07 ***
## - YearBuilt           1 2.3019e+10 6.8205e+11 29457  45.5111 2.276e-11 ***
## - LotArea             1 2.7753e+10 6.8678e+11 29467  54.8710 2.304e-13 ***
## - BsmtFinSF1          1 3.7404e+10 6.9643e+11 29487  73.9529 < 2.2e-16 ***
## - OverallCond         1 3.7426e+10 6.9646e+11 29487  73.9966 < 2.2e-16 ***
## - Neighborhood       24 8.4902e+10 7.4393e+11 29538   6.9943 < 2.2e-16 ***
## - X1stFlrSF           1 6.9904e+10 7.2893e+11 29554 138.2113 < 2.2e-16 ***
## - Condition2          7 1.0342e+11 7.6245e+11 29608  29.2097 < 2.2e-16 ***
## - X2ndFlrSF           1 1.2067e+11 7.7970e+11 29652 238.5790 < 2.2e-16 ***
## - OverallQual_factor  9 1.3104e+11 7.9007e+11 29655  28.7863 < 2.2e-16 ***
## - RoofMatl            7 3.0558e+11 9.6461e+11 29951  86.3105 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29406.16
## SalePrice ~ Id + MSZoning + LotArea + Street + LandContour + 
##     Utilities + LotConfig + LandSlope + Neighborhood + Condition1 + 
##     Condition2 + BldgType + OverallCond + YearBuilt + YearRemodAdd + 
##     RoofStyle + RoofMatl + Exterior1st + ExterQual + Foundation + 
##     BsmtFinSF1 + BsmtFinSF2 + BsmtUnfSF + CentralAir + X1stFlrSF + 
##     X2ndFlrSF + LowQualFinSF + BsmtFullBath + BsmtHalfBath + 
##     FullBath + HalfBath + BedroomAbvGr + KitchenAbvGr + KitchenQual + 
##     TotRmsAbvGrd + Functional + Fireplaces + GarageCars + GarageArea + 
##     WoodDeckSF + OpenPorchSF + EnclosedPorch + X3SsnPorch + ScreenPorch + 
##     PoolArea + MiscVal + MoSold + YrSold + SaleType + SaleCondition + 
##     OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - YrSold              1 5.6712e+06 6.5972e+11 29404   0.0112 0.9156645    
## - MiscVal             1 2.2466e+07 6.5973e+11 29404   0.0444 0.8330675    
## - LowQualFinSF        1 2.4013e+07 6.5973e+11 29404   0.0475 0.8275044    
## - CentralAir          1 6.1811e+07 6.5977e+11 29404   0.1223 0.7266406    
## - Id                  1 7.9396e+07 6.5979e+11 29404   0.1571 0.6919454    
## - BsmtHalfBath        1 9.3955e+07 6.5980e+11 29404   0.1859 0.6664589    
## - HalfBath            1 1.1881e+08 6.5983e+11 29404   0.2350 0.6279065    
## - SaleCondition       5 4.1087e+09 6.6382e+11 29405   1.6255 0.1501831    
## - OpenPorchSF         1 5.1708e+08 6.6023e+11 29405   1.0228 0.3120316    
## - TotRmsAbvGrd        1 5.8185e+08 6.6029e+11 29405   1.1510 0.2835409    
## - BsmtFullBath        1 6.3854e+08 6.6035e+11 29406   1.2631 0.2612662    
## - Utilities           1 6.5188e+08 6.6036e+11 29406   1.2895 0.2563453    
## - ExterQual           3 2.5612e+09 6.6227e+11 29406   1.6888 0.1675591    
## - Exterior1st        14 1.2718e+10 6.7243e+11 29406   1.7970 0.0342422 *  
## <none>                             6.5971e+11 29406                       
## - EnclosedPorch       1 9.4144e+08 6.6065e+11 29406   1.8623 0.1725936    
## - FullBath            1 1.0343e+09 6.6074e+11 29406   2.0459 0.1528535    
## - WoodDeckSF          1 1.0667e+09 6.6078e+11 29407   2.1101 0.1465673    
## - GarageCars          1 1.0895e+09 6.6080e+11 29407   2.1552 0.1423268    
## - YearRemodAdd        1 1.4648e+09 6.6117e+11 29407   2.8975 0.0889535 .  
## - SaleType            8 7.8639e+09 6.6757e+11 29408   1.9445 0.0501328 .  
## - Foundation          5 5.9596e+09 6.6567e+11 29409   2.3578 0.0383863 *  
## - GarageArea          1 2.4837e+09 6.6219e+11 29410   4.9131 0.0268249 *  
## - X3SsnPorch          1 2.5696e+09 6.6228e+11 29410   5.0830 0.0243269 *  
## - RoofStyle           5 6.5799e+09 6.6629e+11 29411   2.6032 0.0236959 *  
## - MoSold              1 3.1140e+09 6.6282e+11 29411   6.1600 0.0131924 *  
## - MSZoning            4 5.9208e+09 6.6563e+11 29411   2.9280 0.0199918 *  
## - LandContour         3 5.0620e+09 6.6477e+11 29411   3.3378 0.0187452 *  
## - LotConfig           4 6.3515e+09 6.6606e+11 29412   3.1410 0.0139141 *  
## - Fireplaces          1 3.9970e+09 6.6371e+11 29413   7.9066 0.0049992 ** 
## - Street              1 4.2383e+09 6.6395e+11 29414   8.3839 0.0038487 ** 
## - BedroomAbvGr        1 5.0607e+09 6.6477e+11 29415  10.0109 0.0015921 ** 
## - KitchenAbvGr        1 5.2178e+09 6.6493e+11 29416  10.3215 0.0013470 ** 
## - ScreenPorch         1 6.1841e+09 6.6589e+11 29418  12.2330 0.0004853 ***
## - PoolArea            1 7.4895e+09 6.6720e+11 29421  14.8153 0.0001243 ***
## - BsmtUnfSF           1 7.5904e+09 6.6730e+11 29421  15.0148 0.0001120 ***
## - Condition1          8 1.4418e+10 6.7413e+11 29422   3.5651 0.0004241 ***
## - KitchenQual         3 1.1132e+10 6.7084e+11 29425   7.3400 7.027e-05 ***
## - LandSlope           2 1.0675e+10 6.7039e+11 29426  10.5585 2.826e-05 ***
## - BsmtFinSF2          1 1.0119e+10 6.6983e+11 29426  20.0176 8.341e-06 ***
## - BldgType            4 1.6179e+10 6.7589e+11 29434   8.0010 2.264e-06 ***
## - Functional          6 2.0927e+10 6.8064e+11 29440   6.8993 3.149e-07 ***
## - YearBuilt           1 2.3393e+10 6.8310e+11 29455  46.2744 1.561e-11 ***
## - LotArea             1 2.7763e+10 6.8747e+11 29464  54.9186 2.249e-13 ***
## - OverallCond         1 3.7013e+10 6.9672e+11 29484  73.2171 < 2.2e-16 ***
## - BsmtFinSF1          1 3.7410e+10 6.9712e+11 29485  74.0021 < 2.2e-16 ***
## - Neighborhood       24 8.5375e+10 7.4509e+11 29536   7.0368 < 2.2e-16 ***
## - X1stFlrSF           1 6.9529e+10 7.2924e+11 29551 137.5379 < 2.2e-16 ***
## - Condition2          7 1.0319e+11 7.6290e+11 29604  29.1608 < 2.2e-16 ***
## - X2ndFlrSF           1 1.2026e+11 7.7997e+11 29649 237.8978 < 2.2e-16 ***
## - OverallQual_factor  9 1.3125e+11 7.9096e+11 29653  28.8472 < 2.2e-16 ***
## - RoofMatl            7 3.0536e+11 9.6507e+11 29948  86.2920 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29404.17
## SalePrice ~ Id + MSZoning + LotArea + Street + LandContour + 
##     Utilities + LotConfig + LandSlope + Neighborhood + Condition1 + 
##     Condition2 + BldgType + OverallCond + YearBuilt + YearRemodAdd + 
##     RoofStyle + RoofMatl + Exterior1st + ExterQual + Foundation + 
##     BsmtFinSF1 + BsmtFinSF2 + BsmtUnfSF + CentralAir + X1stFlrSF + 
##     X2ndFlrSF + LowQualFinSF + BsmtFullBath + BsmtHalfBath + 
##     FullBath + HalfBath + BedroomAbvGr + KitchenAbvGr + KitchenQual + 
##     TotRmsAbvGrd + Functional + Fireplaces + GarageCars + GarageArea + 
##     WoodDeckSF + OpenPorchSF + EnclosedPorch + X3SsnPorch + ScreenPorch + 
##     PoolArea + MiscVal + MoSold + SaleType + SaleCondition + 
##     OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - MiscVal             1 2.2846e+07 6.5974e+11 29402   0.0452 0.8316216    
## - LowQualFinSF        1 2.3279e+07 6.5974e+11 29402   0.0461 0.8300555    
## - CentralAir          1 6.1114e+07 6.5978e+11 29402   0.1210 0.7280264    
## - Id                  1 7.8616e+07 6.5979e+11 29402   0.1556 0.6932758    
## - BsmtHalfBath        1 9.2407e+07 6.5981e+11 29402   0.1829 0.6689363    
## - HalfBath            1 1.1884e+08 6.5983e+11 29402   0.2353 0.6277350    
## - SaleCondition       5 4.1293e+09 6.6385e+11 29403   1.6349 0.1477145    
## - OpenPorchSF         1 5.1212e+08 6.6023e+11 29403   1.0138 0.3141755    
## - TotRmsAbvGrd        1 5.8043e+08 6.6030e+11 29404   1.1490 0.2839478    
## - BsmtFullBath        1 6.4724e+08 6.6036e+11 29404   1.2813 0.2578652    
## - Utilities           1 6.5019e+08 6.6037e+11 29404   1.2871 0.2567844    
## - ExterQual           3 2.6113e+09 6.6233e+11 29404   1.7231 0.1603663    
## - Exterior1st        14 1.2746e+10 6.7246e+11 29404   1.8024 0.0335267 *  
## <none>                             6.5972e+11 29404                       
## - EnclosedPorch       1 9.3932e+08 6.6066e+11 29404   1.8595 0.1729156    
## - FullBath            1 1.0364e+09 6.6075e+11 29405   2.0517 0.1522774    
## - WoodDeckSF          1 1.0688e+09 6.6078e+11 29405   2.1158 0.1460271    
## - GarageCars          1 1.0868e+09 6.6080e+11 29405   2.1514 0.1426784    
## - SaleType            8 7.8584e+09 6.6757e+11 29406   1.9446 0.0501150 .  
## - YearRemodAdd        1 1.4887e+09 6.6120e+11 29406   2.9472 0.0862662 .  
## - Foundation          5 5.9560e+09 6.6567e+11 29407   2.3582 0.0383577 *  
## - GarageArea          1 2.4834e+09 6.6220e+11 29408   4.9163 0.0267760 *  
## - X3SsnPorch          1 2.5728e+09 6.6229e+11 29408   5.0931 0.0241853 *  
## - RoofStyle           5 6.5920e+09 6.6631e+11 29409   2.6100 0.0233794 *  
## - MSZoning            4 5.9151e+09 6.6563e+11 29409   2.9274 0.0200114 *  
## - MoSold              1 3.2017e+09 6.6292e+11 29409   6.3381 0.0119358 *  
## - LandContour         3 5.0762e+09 6.6479e+11 29409   3.3497 0.0184444 *  
## - LotConfig           4 6.3600e+09 6.6608e+11 29410   3.1476 0.0137575 *  
## - Fireplaces          1 3.9980e+09 6.6371e+11 29411   7.9147 0.0049771 ** 
## - Street              1 4.2347e+09 6.6395e+11 29412   8.3832 0.0038500 ** 
## - BedroomAbvGr        1 5.0626e+09 6.6478e+11 29413  10.0220 0.0015825 ** 
## - KitchenAbvGr        1 5.2210e+09 6.6494e+11 29414  10.3357 0.0013367 ** 
## - ScreenPorch         1 6.1962e+09 6.6591e+11 29416  12.2663 0.0004768 ***
## - PoolArea            1 7.4924e+09 6.6721e+11 29419  14.8323 0.0001232 ***
## - BsmtUnfSF           1 7.5951e+09 6.6731e+11 29419  15.0355 0.0001108 ***
## - Condition1          8 1.4412e+10 6.7413e+11 29420   3.5664 0.0004223 ***
## - KitchenQual         3 1.1142e+10 6.7086e+11 29423   7.3525 6.904e-05 ***
## - LandSlope           2 1.0673e+10 6.7039e+11 29424  10.5642 2.810e-05 ***
## - BsmtFinSF2          1 1.0139e+10 6.6986e+11 29424  20.0725 8.108e-06 ***
## - BldgType            4 1.6322e+10 6.7604e+11 29432   8.0778 1.966e-06 ***
## - Functional          6 2.0921e+10 6.8064e+11 29438   6.9027 3.120e-07 ***
## - YearBuilt           1 2.3388e+10 6.8310e+11 29453  46.2994 1.542e-11 ***
## - LotArea             1 2.7757e+10 6.8747e+11 29462  54.9493 2.215e-13 ***
## - OverallCond         1 3.7045e+10 6.9676e+11 29482  73.3363 < 2.2e-16 ***
## - BsmtFinSF1          1 3.7408e+10 6.9712e+11 29483  74.0540 < 2.2e-16 ***
## - Neighborhood       24 8.5429e+10 7.4514e+11 29534   7.0466 < 2.2e-16 ***
## - X1stFlrSF           1 6.9547e+10 7.2926e+11 29549 137.6783 < 2.2e-16 ***
## - Condition2          7 1.0321e+11 7.6293e+11 29602  29.1882 < 2.2e-16 ***
## - X2ndFlrSF           1 1.2028e+11 7.7999e+11 29647 238.1025 < 2.2e-16 ***
## - OverallQual_factor  9 1.3126e+11 7.9097e+11 29651  28.8710 < 2.2e-16 ***
## - RoofMatl            7 3.0604e+11 9.6576e+11 29947  86.5507 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29402.22
## SalePrice ~ Id + MSZoning + LotArea + Street + LandContour + 
##     Utilities + LotConfig + LandSlope + Neighborhood + Condition1 + 
##     Condition2 + BldgType + OverallCond + YearBuilt + YearRemodAdd + 
##     RoofStyle + RoofMatl + Exterior1st + ExterQual + Foundation + 
##     BsmtFinSF1 + BsmtFinSF2 + BsmtUnfSF + CentralAir + X1stFlrSF + 
##     X2ndFlrSF + LowQualFinSF + BsmtFullBath + BsmtHalfBath + 
##     FullBath + HalfBath + BedroomAbvGr + KitchenAbvGr + KitchenQual + 
##     TotRmsAbvGrd + Functional + Fireplaces + GarageCars + GarageArea + 
##     WoodDeckSF + OpenPorchSF + EnclosedPorch + X3SsnPorch + ScreenPorch + 
##     PoolArea + MoSold + SaleType + SaleCondition + OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - LowQualFinSF        1 2.4049e+07 6.5976e+11 29400   0.0476 0.8272505    
## - CentralAir          1 6.0840e+07 6.5980e+11 29400   0.1205 0.7285177    
## - Id                  1 7.6755e+07 6.5982e+11 29400   0.1521 0.6966394    
## - BsmtHalfBath        1 9.4301e+07 6.5983e+11 29400   0.1868 0.6656487    
## - HalfBath            1 1.1601e+08 6.5985e+11 29401   0.2298 0.6317329    
## - SaleCondition       5 4.1250e+09 6.6386e+11 29401   1.6344 0.1478526    
## - OpenPorchSF         1 5.1305e+08 6.6025e+11 29401   1.0164 0.3135598    
## - TotRmsAbvGrd        1 5.7793e+08 6.6032e+11 29402   1.1449 0.2848102    
## - Utilities           1 6.4898e+08 6.6039e+11 29402   1.2857 0.2570541    
## - BsmtFullBath        1 6.5005e+08 6.6039e+11 29402   1.2878 0.2566617    
## - ExterQual           3 2.5941e+09 6.6233e+11 29402   1.7131 0.1624442    
## - Exterior1st        14 1.2734e+10 6.7247e+11 29402   1.8019 0.0335829 *  
## <none>                             6.5974e+11 29402                       
## - EnclosedPorch       1 9.4200e+08 6.6068e+11 29402   1.8662 0.1721470    
## - FullBath            1 1.0355e+09 6.6077e+11 29403   2.0514 0.1523083    
## - WoodDeckSF          1 1.0719e+09 6.6081e+11 29403   2.1235 0.1452961    
## - GarageCars          1 1.0956e+09 6.6083e+11 29403   2.1705 0.1409253    
## - YearRemodAdd        1 1.4801e+09 6.6122e+11 29404   2.9323 0.0870613 .  
## - SaleType            8 7.8764e+09 6.6762e+11 29404   1.9505 0.0493416 *  
## - Foundation          5 5.9507e+09 6.6569e+11 29405   2.3578 0.0383862 *  
## - GarageArea          1 2.4804e+09 6.6222e+11 29406   4.9139 0.0268128 *  
## - X3SsnPorch          1 2.5714e+09 6.6231e+11 29406   5.0941 0.0241723 *  
## - RoofStyle           5 6.5832e+09 6.6632e+11 29407   2.6084 0.0234530 *  
## - MSZoning            4 5.9037e+09 6.6564e+11 29407   2.9239 0.0201311 *  
## - MoSold              1 3.1978e+09 6.6294e+11 29407   6.3351 0.0119560 *  
## - LandContour         3 5.0677e+09 6.6481e+11 29407   3.3465 0.0185241 *  
## - LotConfig           4 6.3391e+09 6.6608e+11 29408   3.1396 0.0139478 *  
## - Fireplaces          1 3.9941e+09 6.6373e+11 29409   7.9127 0.0049825 ** 
## - Street              1 4.2438e+09 6.6398e+11 29410   8.4074 0.0037994 ** 
## - BedroomAbvGr        1 5.0552e+09 6.6479e+11 29411  10.0148 0.0015887 ** 
## - KitchenAbvGr        1 5.2320e+09 6.6497e+11 29412  10.3650 0.0013159 ** 
## - ScreenPorch         1 6.1806e+09 6.6592e+11 29414  12.2443 0.0004824 ***
## - PoolArea            1 7.4704e+09 6.6721e+11 29417  14.7996 0.0001253 ***
## - BsmtUnfSF           1 7.5786e+09 6.6732e+11 29417  15.0138 0.0001120 ***
## - Condition1          8 1.4404e+10 6.7414e+11 29418   3.5669 0.0004217 ***
## - KitchenQual         3 1.1154e+10 6.7089e+11 29421   7.3654 6.778e-05 ***
## - LandSlope           2 1.0684e+10 6.7042e+11 29422  10.5833 2.758e-05 ***
## - BsmtFinSF2          1 1.0129e+10 6.6987e+11 29423  20.0658 8.136e-06 ***
## - BldgType            4 1.6305e+10 6.7604e+11 29430   8.0754 1.974e-06 ***
## - Functional          6 2.1055e+10 6.8079e+11 29436   6.9521 2.738e-07 ***
## - YearBuilt           1 2.3387e+10 6.8313e+11 29451  46.3321 1.517e-11 ***
## - LotArea             1 2.7736e+10 6.8747e+11 29460  54.9481 2.215e-13 ***
## - OverallCond         1 3.7056e+10 6.9679e+11 29480  73.4105 < 2.2e-16 ***
## - BsmtFinSF1          1 3.7387e+10 6.9713e+11 29481  74.0675 < 2.2e-16 ***
## - Neighborhood       24 8.5466e+10 7.4520e+11 29532   7.0548 < 2.2e-16 ***
## - X1stFlrSF           1 6.9858e+10 7.2960e+11 29547 138.3941 < 2.2e-16 ***
## - Condition2          7 1.0383e+11 7.6357e+11 29602  29.3858 < 2.2e-16 ***
## - X2ndFlrSF           1 1.2031e+11 7.8004e+11 29645 238.3372 < 2.2e-16 ***
## - OverallQual_factor  9 1.3125e+11 7.9099e+11 29649  28.8912 < 2.2e-16 ***
## - RoofMatl            7 3.0602e+11 9.6576e+11 29945  86.6080 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29400.27
## SalePrice ~ Id + MSZoning + LotArea + Street + LandContour + 
##     Utilities + LotConfig + LandSlope + Neighborhood + Condition1 + 
##     Condition2 + BldgType + OverallCond + YearBuilt + YearRemodAdd + 
##     RoofStyle + RoofMatl + Exterior1st + ExterQual + Foundation + 
##     BsmtFinSF1 + BsmtFinSF2 + BsmtUnfSF + CentralAir + X1stFlrSF + 
##     X2ndFlrSF + BsmtFullBath + BsmtHalfBath + FullBath + HalfBath + 
##     BedroomAbvGr + KitchenAbvGr + KitchenQual + TotRmsAbvGrd + 
##     Functional + Fireplaces + GarageCars + GarageArea + WoodDeckSF + 
##     OpenPorchSF + EnclosedPorch + X3SsnPorch + ScreenPorch + 
##     PoolArea + MoSold + SaleType + SaleCondition + OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - CentralAir          1 6.4654e+07 6.5983e+11 29398   0.1282 0.7203857    
## - Id                  1 8.2097e+07 6.5984e+11 29399   0.1628 0.6866945    
## - BsmtHalfBath        1 9.4387e+07 6.5986e+11 29399   0.1871 0.6653922    
## - HalfBath            1 1.1375e+08 6.5988e+11 29399   0.2255 0.6349519    
## - SaleCondition       5 4.1115e+09 6.6387e+11 29399   1.6302 0.1489430    
## - OpenPorchSF         1 5.1812e+08 6.6028e+11 29399   1.0272 0.3110076    
## - TotRmsAbvGrd        1 6.4029e+08 6.6040e+11 29400   1.2694 0.2600867    
## - BsmtFullBath        1 6.5083e+08 6.6041e+11 29400   1.2903 0.2562020    
## - Utilities           1 6.5303e+08 6.6042e+11 29400   1.2946 0.2554012    
## - ExterQual           3 2.6395e+09 6.6240e+11 29400   1.7443 0.1560763    
## - Exterior1st        14 1.2717e+10 6.7248e+11 29400   1.8009 0.0337201 *  
## <none>                             6.5976e+11 29400                       
## - EnclosedPorch       1 9.2964e+08 6.6069e+11 29400   1.8430 0.1748284    
## - FullBath            1 1.0489e+09 6.6081e+11 29401   2.0795 0.1495248    
## - WoodDeckSF          1 1.0656e+09 6.6083e+11 29401   2.1126 0.1463318    
## - GarageCars          1 1.0802e+09 6.6084e+11 29401   2.1415 0.1436030    
## - YearRemodAdd        1 1.4889e+09 6.6125e+11 29402   2.9517 0.0860216 .  
## - SaleType            8 7.9045e+09 6.6767e+11 29402   1.9589 0.0482596 *  
## - Foundation          5 5.9562e+09 6.6572e+11 29403   2.3617 0.0380960 *  
## - GarageArea          1 2.5121e+09 6.6227e+11 29404   4.9802 0.0258072 *  
## - X3SsnPorch          1 2.5838e+09 6.6235e+11 29404   5.1226 0.0237802 *  
## - RoofStyle           5 6.5893e+09 6.6635e+11 29405   2.6127 0.0232513 *  
## - MSZoning            4 5.8862e+09 6.6565e+11 29405   2.9174 0.0203550 *  
## - MoSold              1 3.2023e+09 6.6297e+11 29405   6.3487 0.0118649 *  
## - LandContour         3 5.1011e+09 6.6486e+11 29406   3.3711 0.0179136 *  
## - LotConfig           4 6.3670e+09 6.6613e+11 29406   3.1557 0.0135691 *  
## - Fireplaces          1 3.9799e+09 6.6374e+11 29407   7.8902 0.0050442 ** 
## - Street              1 4.3173e+09 6.6408e+11 29408   8.5591 0.0034973 ** 
## - BedroomAbvGr        1 5.0514e+09 6.6481e+11 29409  10.0146 0.0015888 ** 
## - KitchenAbvGr        1 5.3169e+09 6.6508e+11 29410  10.5408 0.0011972 ** 
## - ScreenPorch         1 6.2093e+09 6.6597e+11 29412  12.3101 0.0004658 ***
## - BsmtUnfSF           1 7.5800e+09 6.6734e+11 29415  15.0276 0.0001112 ***
## - PoolArea            1 7.5931e+09 6.6736e+11 29415  15.0535 0.0001097 ***
## - Condition1          8 1.4398e+10 6.7416e+11 29416   3.5680 0.0004201 ***
## - KitchenQual         3 1.1225e+10 6.7099e+11 29419   7.4182 6.291e-05 ***
## - LandSlope           2 1.0738e+10 6.7050e+11 29420  10.6441 2.597e-05 ***
## - BsmtFinSF2          1 1.0155e+10 6.6992e+11 29421  20.1317 7.864e-06 ***
## - BldgType            4 1.6282e+10 6.7604e+11 29428   8.0697 1.995e-06 ***
## - Functional          6 2.1032e+10 6.8079e+11 29434   6.9493 2.758e-07 ***
## - YearBuilt           1 2.3452e+10 6.8322e+11 29449  46.4950 1.399e-11 ***
## - LotArea             1 2.7779e+10 6.8754e+11 29459  55.0724 2.084e-13 ***
## - OverallCond         1 3.7034e+10 6.9680e+11 29478  73.4211 < 2.2e-16 ***
## - BsmtFinSF1          1 3.7402e+10 6.9716e+11 29479  74.1506 < 2.2e-16 ***
## - Neighborhood       24 8.5442e+10 7.4520e+11 29530   7.0580 < 2.2e-16 ***
## - X1stFlrSF           1 7.0095e+10 7.2986e+11 29546 138.9659 < 2.2e-16 ***
## - Condition2          7 1.0384e+11 7.6360e+11 29600  29.4088 < 2.2e-16 ***
## - X2ndFlrSF           1 1.2195e+11 7.8172e+11 29646 241.7743 < 2.2e-16 ***
## - OverallQual_factor  9 1.3176e+11 7.9152e+11 29648  29.0238 < 2.2e-16 ***
## - RoofMatl            7 3.0751e+11 9.6727e+11 29945  87.0932 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29398.42
## SalePrice ~ Id + MSZoning + LotArea + Street + LandContour + 
##     Utilities + LotConfig + LandSlope + Neighborhood + Condition1 + 
##     Condition2 + BldgType + OverallCond + YearBuilt + YearRemodAdd + 
##     RoofStyle + RoofMatl + Exterior1st + ExterQual + Foundation + 
##     BsmtFinSF1 + BsmtFinSF2 + BsmtUnfSF + X1stFlrSF + X2ndFlrSF + 
##     BsmtFullBath + BsmtHalfBath + FullBath + HalfBath + BedroomAbvGr + 
##     KitchenAbvGr + KitchenQual + TotRmsAbvGrd + Functional + 
##     Fireplaces + GarageCars + GarageArea + WoodDeckSF + OpenPorchSF + 
##     EnclosedPorch + X3SsnPorch + ScreenPorch + PoolArea + MoSold + 
##     SaleType + SaleCondition + OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - Id                  1 8.0497e+07 6.5991e+11 29397   0.1597 0.6895039    
## - BsmtHalfBath        1 9.4321e+07 6.5992e+11 29397   0.1871 0.6653966    
## - HalfBath            1 1.1289e+08 6.5994e+11 29397   0.2240 0.6361181    
## - SaleCondition       5 4.0857e+09 6.6391e+11 29397   1.6211 0.1513615    
## - OpenPorchSF         1 4.8847e+08 6.6032e+11 29398   0.9690 0.3251008    
## - BsmtFullBath        1 6.5293e+08 6.6048e+11 29398   1.2953 0.2552784    
## - TotRmsAbvGrd        1 6.5376e+08 6.6048e+11 29398   1.2970 0.2549760    
## - Utilities           1 6.5572e+08 6.6048e+11 29398   1.3008 0.2542672    
## - ExterQual           3 2.6241e+09 6.6245e+11 29398   1.7353 0.1578955    
## <none>                             6.5983e+11 29398                       
## - Exterior1st        14 1.2783e+10 6.7261e+11 29398   1.8114 0.0323476 *  
## - EnclosedPorch       1 9.4704e+08 6.6077e+11 29399   1.8788 0.1707066    
## - FullBath            1 1.0241e+09 6.6085e+11 29399   2.0317 0.1542908    
## - GarageCars          1 1.0588e+09 6.6089e+11 29399   2.1006 0.1474843    
## - WoodDeckSF          1 1.0772e+09 6.6090e+11 29399   2.1371 0.1440171    
## - SaleType            8 7.8845e+09 6.6771e+11 29400   1.9552 0.0487260 *  
## - YearRemodAdd        1 1.5247e+09 6.6135e+11 29400   3.0247 0.0822413 .  
## - Foundation          5 5.9563e+09 6.6578e+11 29402   2.3633 0.0379763 *  
## - GarageArea          1 2.5662e+09 6.6239e+11 29402   5.0909 0.0242156 *  
## - X3SsnPorch          1 2.5904e+09 6.6242e+11 29402   5.1390 0.0235563 *  
## - RoofStyle           5 6.5553e+09 6.6638e+11 29403   2.6009 0.0238011 *  
## - MoSold              1 3.2065e+09 6.6303e+11 29404   6.3612 0.0117818 *  
## - MSZoning            4 5.9578e+09 6.6579e+11 29404   2.9548 0.0191028 *  
## - LandContour         3 5.1130e+09 6.6494e+11 29404   3.3811 0.0176687 *  
## - LotConfig           4 6.3267e+09 6.6615e+11 29404   3.1378 0.0139903 *  
## - Fireplaces          1 4.1241e+09 6.6395e+11 29406   8.1815 0.0042991 ** 
## - Street              1 4.3266e+09 6.6415e+11 29406   8.5834 0.0034513 ** 
## - BedroomAbvGr        1 5.0067e+09 6.6483e+11 29408   9.9325 0.0016607 ** 
## - KitchenAbvGr        1 5.3700e+09 6.6520e+11 29408  10.6532 0.0011272 ** 
## - ScreenPorch         1 6.2754e+09 6.6610e+11 29410  12.4494 0.0004326 ***
## - BsmtUnfSF           1 7.5547e+09 6.6738e+11 29413  14.9874 0.0001136 ***
## - PoolArea            1 7.5846e+09 6.6741e+11 29413  15.0468 0.0001101 ***
## - Condition1          8 1.4487e+10 6.7431e+11 29414   3.5926 0.0003887 ***
## - KitchenQual         3 1.1194e+10 6.7102e+11 29417   7.4024 6.432e-05 ***
## - LandSlope           2 1.0737e+10 6.7056e+11 29418  10.6506 2.581e-05 ***
## - BsmtFinSF2          1 1.0131e+10 6.6996e+11 29419  20.0989 7.997e-06 ***
## - BldgType            4 1.6312e+10 6.7614e+11 29426   8.0900 1.921e-06 ***
## - Functional          6 2.1025e+10 6.8085e+11 29432   6.9518 2.739e-07 ***
## - YearBuilt           1 2.4273e+10 6.8410e+11 29449  48.1534 6.182e-12 ***
## - LotArea             1 2.7811e+10 6.8764e+11 29457  55.1721 1.984e-13 ***
## - BsmtFinSF1          1 3.7348e+10 6.9718e+11 29477  74.0923 < 2.2e-16 ***
## - OverallCond         1 3.8570e+10 6.9840e+11 29479  76.5176 < 2.2e-16 ***
## - Neighborhood       24 8.5390e+10 7.4522e+11 29528   7.0584 < 2.2e-16 ***
## - X1stFlrSF           1 7.0324e+10 7.3015e+11 29544 139.5119 < 2.2e-16 ***
## - Condition2          7 1.0377e+11 7.6360e+11 29598  29.4104 < 2.2e-16 ***
## - X2ndFlrSF           1 1.2192e+11 7.8174e+11 29644 241.8619 < 2.2e-16 ***
## - OverallQual_factor  9 1.3170e+11 7.9153e+11 29646  29.0305 < 2.2e-16 ***
## - RoofMatl            7 3.0765e+11 9.6748e+11 29943  87.1914 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29396.59
## SalePrice ~ MSZoning + LotArea + Street + LandContour + Utilities + 
##     LotConfig + LandSlope + Neighborhood + Condition1 + Condition2 + 
##     BldgType + OverallCond + YearBuilt + YearRemodAdd + RoofStyle + 
##     RoofMatl + Exterior1st + ExterQual + Foundation + BsmtFinSF1 + 
##     BsmtFinSF2 + BsmtUnfSF + X1stFlrSF + X2ndFlrSF + BsmtFullBath + 
##     BsmtHalfBath + FullBath + HalfBath + BedroomAbvGr + KitchenAbvGr + 
##     KitchenQual + TotRmsAbvGrd + Functional + Fireplaces + GarageCars + 
##     GarageArea + WoodDeckSF + OpenPorchSF + EnclosedPorch + X3SsnPorch + 
##     ScreenPorch + PoolArea + MoSold + SaleType + SaleCondition + 
##     OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - BsmtHalfBath        1 9.8345e+07 6.6001e+11 29395   0.1952 0.6586737    
## - HalfBath            1 1.1620e+08 6.6002e+11 29395   0.2307 0.6311094    
## - SaleCondition       5 4.0869e+09 6.6399e+11 29396   1.6226 0.1509528    
## - OpenPorchSF         1 4.8563e+08 6.6039e+11 29396   0.9640 0.3263537    
## - TotRmsAbvGrd        1 6.3945e+08 6.6055e+11 29396   1.2694 0.2600871    
## - BsmtFullBath        1 6.4695e+08 6.6055e+11 29396   1.2843 0.2573139    
## - Utilities           1 6.5957e+08 6.6057e+11 29396   1.3093 0.2527261    
## - ExterQual           3 2.6221e+09 6.6253e+11 29396   1.7351 0.1579371    
## <none>                             6.5991e+11 29397                       
## - Exterior1st        14 1.2811e+10 6.7272e+11 29397   1.8166 0.0316887 *  
## - EnclosedPorch       1 9.4900e+08 6.6086e+11 29397   1.8839 0.1701285    
## - FullBath            1 1.0219e+09 6.6093e+11 29397   2.0286 0.1545977    
## - GarageCars          1 1.0574e+09 6.6097e+11 29397   2.0991 0.1476235    
## - WoodDeckSF          1 1.0936e+09 6.6100e+11 29397   2.1709 0.1408818    
## - SaleType            8 7.8402e+09 6.6775e+11 29398   1.9455 0.0499968 *  
## - YearRemodAdd        1 1.5455e+09 6.6145e+11 29398   3.0680 0.0800814 .  
## - Foundation          5 5.9668e+09 6.6587e+11 29400   2.3690 0.0375595 *  
## - GarageArea          1 2.5429e+09 6.6245e+11 29400   5.0480 0.0248209 *  
## - X3SsnPorch          1 2.6387e+09 6.6255e+11 29400   5.2381 0.0222556 *  
## - RoofStyle           5 6.5101e+09 6.6642e+11 29401   2.5847 0.0245815 *  
## - MSZoning            4 5.9464e+09 6.6585e+11 29402   2.9511 0.0192240 *  
## - MoSold              1 3.2393e+09 6.6315e+11 29402   6.4305 0.0113332 *  
## - LandContour         3 5.1384e+09 6.6505e+11 29402   3.4002 0.0172158 *  
## - LotConfig           4 6.3718e+09 6.6628e+11 29403   3.1622 0.0134177 *  
## - Fireplaces          1 4.1439e+09 6.6405e+11 29404   8.2262 0.0041951 ** 
## - Street              1 4.3195e+09 6.6423e+11 29404   8.5747 0.0034676 ** 
## - BedroomAbvGr        1 5.0292e+09 6.6494e+11 29406   9.9836 0.0016155 ** 
## - KitchenAbvGr        1 5.3197e+09 6.6523e+11 29406  10.5602 0.0011848 ** 
## - ScreenPorch         1 6.2871e+09 6.6619e+11 29408  12.4807 0.0004255 ***
## - PoolArea            1 7.5317e+09 6.6744e+11 29411  14.9514 0.0001157 ***
## - BsmtUnfSF           1 7.6042e+09 6.6751e+11 29411  15.0952 0.0001073 ***
## - Condition1          8 1.4477e+10 6.7438e+11 29412   3.5922 0.0003892 ***
## - KitchenQual         3 1.1170e+10 6.7108e+11 29415   7.3910 6.536e-05 ***
## - LandSlope           2 1.0713e+10 6.7062e+11 29416  10.6329 2.626e-05 ***
## - BsmtFinSF2          1 1.0170e+10 6.7008e+11 29417  20.1894 7.632e-06 ***
## - BldgType            4 1.6473e+10 6.7638e+11 29425   8.1755 1.642e-06 ***
## - Functional          6 2.0999e+10 6.8091e+11 29430   6.9475 2.770e-07 ***
## - YearBuilt           1 2.4505e+10 6.8441e+11 29448  48.6458 4.851e-12 ***
## - LotArea             1 2.7967e+10 6.8787e+11 29455  55.5177 1.675e-13 ***
## - BsmtFinSF1          1 3.7520e+10 6.9743e+11 29475  74.4827 < 2.2e-16 ***
## - OverallCond         1 3.8554e+10 6.9846e+11 29478  76.5344 < 2.2e-16 ***
## - Neighborhood       24 8.5819e+10 7.4573e+11 29527   7.0984 < 2.2e-16 ***
## - X1stFlrSF           1 7.0314e+10 7.3022e+11 29542 139.5822 < 2.2e-16 ***
## - Condition2          7 1.0373e+11 7.6363e+11 29596  29.4155 < 2.2e-16 ***
## - X2ndFlrSF           1 1.2227e+11 7.8217e+11 29643 242.7121 < 2.2e-16 ***
## - OverallQual_factor  9 1.3167e+11 7.9157e+11 29644  29.0416 < 2.2e-16 ***
## - RoofMatl            7 3.0882e+11 9.6873e+11 29943  87.5780 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29394.81
## SalePrice ~ MSZoning + LotArea + Street + LandContour + Utilities + 
##     LotConfig + LandSlope + Neighborhood + Condition1 + Condition2 + 
##     BldgType + OverallCond + YearBuilt + YearRemodAdd + RoofStyle + 
##     RoofMatl + Exterior1st + ExterQual + Foundation + BsmtFinSF1 + 
##     BsmtFinSF2 + BsmtUnfSF + X1stFlrSF + X2ndFlrSF + BsmtFullBath + 
##     FullBath + HalfBath + BedroomAbvGr + KitchenAbvGr + KitchenQual + 
##     TotRmsAbvGrd + Functional + Fireplaces + GarageCars + GarageArea + 
##     WoodDeckSF + OpenPorchSF + EnclosedPorch + X3SsnPorch + ScreenPorch + 
##     PoolArea + MoSold + SaleType + SaleCondition + OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - HalfBath            1 1.2424e+08 6.6013e+11 29393   0.2468 0.6194342    
## - SaleCondition       5 4.0903e+09 6.6410e+11 29394   1.6250 0.1503325    
## - OpenPorchSF         1 4.9113e+08 6.6050e+11 29394   0.9755 0.3234836    
## - BsmtFullBath        1 5.5299e+08 6.6056e+11 29394   1.0984 0.2948042    
## - Utilities           1 6.1278e+08 6.6062e+11 29394   1.2172 0.2701130    
## - TotRmsAbvGrd        1 6.3356e+08 6.6064e+11 29394   1.2585 0.2621466    
## - ExterQual           3 2.6436e+09 6.6265e+11 29395   1.7504 0.1548707    
## <none>                             6.6001e+11 29395                       
## - EnclosedPorch       1 9.7153e+08 6.6098e+11 29395   1.9298 0.1650175    
## - FullBath            1 9.7627e+08 6.6098e+11 29395   1.9392 0.1639911    
## - Exterior1st        14 1.2858e+10 6.7286e+11 29395   1.8243 0.0307275 *  
## - GarageCars          1 1.0644e+09 6.6107e+11 29395   2.1142 0.1461781    
## - WoodDeckSF          1 1.1227e+09 6.6113e+11 29395   2.2301 0.1355815    
## - SaleType            8 7.8941e+09 6.6790e+11 29396   1.9601 0.0481053 *  
## - YearRemodAdd        1 1.5922e+09 6.6160e+11 29396   3.1626 0.0755751 .  
## - Foundation          5 5.9798e+09 6.6599e+11 29398   2.3756 0.0370767 *  
## - GarageArea          1 2.5595e+09 6.6257e+11 29399   5.0840 0.0243123 *  
## - X3SsnPorch          1 2.6857e+09 6.6269e+11 29399   5.3348 0.0210588 *  
## - RoofStyle           5 6.4879e+09 6.6649e+11 29399   2.5774 0.0249364 *  
## - MSZoning            4 5.8791e+09 6.6589e+11 29400   2.9195 0.0202825 *  
## - MoSold              1 3.2108e+09 6.6322e+11 29400   6.3778 0.0116730 *  
## - LandContour         3 5.2511e+09 6.6526e+11 29400   3.4769 0.0155029 *  
## - LotConfig           4 6.3602e+09 6.6637e+11 29401   3.1584 0.0135054 *  
## - Fireplaces          1 4.1445e+09 6.6415e+11 29402   8.2324 0.0041809 ** 
## - Street              1 4.3561e+09 6.6436e+11 29402   8.6526 0.0033233 ** 
## - BedroomAbvGr        1 4.9651e+09 6.6497e+11 29404   9.8625 0.0017245 ** 
## - KitchenAbvGr        1 5.3455e+09 6.6535e+11 29405  10.6179 0.0011487 ** 
## - ScreenPorch         1 6.2615e+09 6.6627e+11 29407  12.4376 0.0004353 ***
## - PoolArea            1 7.5280e+09 6.6753e+11 29409  14.9533 0.0001156 ***
## - BsmtUnfSF           1 7.6266e+09 6.6763e+11 29410  15.1490 0.0001043 ***
## - Condition1          8 1.4512e+10 6.7452e+11 29411   3.6033 0.0003758 ***
## - KitchenQual         3 1.1186e+10 6.7119e+11 29413   7.4064 6.395e-05 ***
## - LandSlope           2 1.0663e+10 6.7067e+11 29414  10.5897 2.740e-05 ***
## - BsmtFinSF2          1 1.0561e+10 6.7057e+11 29416  20.9786 5.086e-06 ***
## - BldgType            4 1.6389e+10 6.7639e+11 29423   8.1384 1.757e-06 ***
## - Functional          6 2.1046e+10 6.8105e+11 29429   6.9673 2.628e-07 ***
## - YearBuilt           1 2.4574e+10 6.8458e+11 29446  48.8132 4.466e-12 ***
## - LotArea             1 2.7954e+10 6.8796e+11 29453  55.5259 1.668e-13 ***
## - OverallCond         1 3.8918e+10 6.9892e+11 29477  77.3056 < 2.2e-16 ***
## - BsmtFinSF1          1 3.9096e+10 6.9910e+11 29477  77.6589 < 2.2e-16 ***
## - Neighborhood       24 8.5761e+10 7.4577e+11 29525   7.0980 < 2.2e-16 ***
## - X1stFlrSF           1 7.0218e+10 7.3022e+11 29540 139.4770 < 2.2e-16 ***
## - Condition2          7 1.0384e+11 7.6384e+11 29594  29.4654 < 2.2e-16 ***
## - X2ndFlrSF           1 1.2233e+11 7.8234e+11 29641 242.9956 < 2.2e-16 ***
## - OverallQual_factor  9 1.3157e+11 7.9158e+11 29642  29.0385 < 2.2e-16 ***
## - RoofMatl            7 3.1094e+11 9.7095e+11 29944  88.2334 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29393.09
## SalePrice ~ MSZoning + LotArea + Street + LandContour + Utilities + 
##     LotConfig + LandSlope + Neighborhood + Condition1 + Condition2 + 
##     BldgType + OverallCond + YearBuilt + YearRemodAdd + RoofStyle + 
##     RoofMatl + Exterior1st + ExterQual + Foundation + BsmtFinSF1 + 
##     BsmtFinSF2 + BsmtUnfSF + X1stFlrSF + X2ndFlrSF + BsmtFullBath + 
##     FullBath + BedroomAbvGr + KitchenAbvGr + KitchenQual + TotRmsAbvGrd + 
##     Functional + Fireplaces + GarageCars + GarageArea + WoodDeckSF + 
##     OpenPorchSF + EnclosedPorch + X3SsnPorch + ScreenPorch + 
##     PoolArea + MoSold + SaleType + SaleCondition + OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - SaleCondition       5 4.0309e+09 6.6416e+11 29392   1.6023 0.1564536    
## - OpenPorchSF         1 4.4917e+08 6.6058e+11 29392   0.8927 0.3449157    
## - BsmtFullBath        1 5.7516e+08 6.6071e+11 29392   1.1431 0.2851900    
## - Utilities           1 5.9338e+08 6.6072e+11 29392   1.1793 0.2776913    
## - TotRmsAbvGrd        1 6.2056e+08 6.6075e+11 29393   1.2333 0.2669601    
## - ExterQual           3 2.6148e+09 6.6275e+11 29393   1.7323 0.1584987    
## <none>                             6.6013e+11 29393                       
## - Exterior1st        14 1.2829e+10 6.7296e+11 29393   1.8212 0.0311059 *  
## - EnclosedPorch       1 9.6719e+08 6.6110e+11 29393   1.9223 0.1658416    
## - GarageCars          1 1.0157e+09 6.6115e+11 29393   2.0186 0.1556168    
## - WoodDeckSF          1 1.1120e+09 6.6124e+11 29394   2.2101 0.1373524    
## - FullBath            1 1.4980e+09 6.6163e+11 29394   2.9773 0.0846754 .  
## - SaleType            8 7.8989e+09 6.6803e+11 29395   1.9624 0.0478094 *  
## - YearRemodAdd        1 1.5499e+09 6.6168e+11 29395   3.0804 0.0794727 .  
## - Foundation          5 5.9803e+09 6.6611e+11 29396   2.3772 0.0369625 *  
## - GarageArea          1 2.6531e+09 6.6278e+11 29397   5.2730 0.0218154 *  
## - X3SsnPorch          1 2.6697e+09 6.6280e+11 29397   5.3060 0.0214084 *  
## - RoofStyle           5 6.4732e+09 6.6660e+11 29397   2.5731 0.0251526 *  
## - MSZoning            4 5.8282e+09 6.6596e+11 29398   2.8959 0.0211079 *  
## - MoSold              1 3.1649e+09 6.6330e+11 29398   6.2903 0.0122602 *  
## - LandContour         3 5.2711e+09 6.6540e+11 29399   3.4921 0.0151827 *  
## - LotConfig           4 6.4105e+09 6.6654e+11 29399   3.1852 0.0129004 *  
## - Fireplaces          1 4.0949e+09 6.6423e+11 29400   8.1385 0.0044015 ** 
## - Street              1 4.3348e+09 6.6447e+11 29401   8.6153 0.0033916 ** 
## - BedroomAbvGr        1 4.9087e+09 6.6504e+11 29402   9.7559 0.0018266 ** 
## - KitchenAbvGr        1 5.3854e+09 6.6552e+11 29403  10.7035 0.0010971 ** 
## - ScreenPorch         1 6.1915e+09 6.6632e+11 29405  12.3056 0.0004669 ***
## - PoolArea            1 7.6484e+09 6.6778e+11 29408  15.2011 0.0001015 ***
## - BsmtUnfSF           1 7.6560e+09 6.6779e+11 29408  15.2163 0.0001007 ***
## - Condition1          8 1.4547e+10 6.7468e+11 29409   3.6140 0.0003633 ***
## - KitchenQual         3 1.1112e+10 6.7124e+11 29412   7.3613 6.815e-05 ***
## - LandSlope           2 1.0638e+10 6.7077e+11 29412  10.5717 2.788e-05 ***
## - BsmtFinSF2          1 1.0541e+10 6.7067e+11 29414  20.9507 5.159e-06 ***
## - BldgType            4 1.6312e+10 6.7644e+11 29421   8.1050 1.868e-06 ***
## - Functional          6 2.0999e+10 6.8113e+11 29427   6.9558 2.709e-07 ***
## - YearBuilt           1 2.4704e+10 6.8483e+11 29445  49.0990 3.880e-12 ***
## - LotArea             1 2.8097e+10 6.8823e+11 29452  55.8420 1.429e-13 ***
## - BsmtFinSF1          1 3.9104e+10 6.9923e+11 29475  77.7185 < 2.2e-16 ***
## - OverallCond         1 3.9227e+10 6.9936e+11 29475  77.9636 < 2.2e-16 ***
## - Neighborhood       24 8.5873e+10 7.4600e+11 29524   7.1113 < 2.2e-16 ***
## - X1stFlrSF           1 7.0100e+10 7.3023e+11 29538 139.3231 < 2.2e-16 ***
## - Condition2          7 1.0379e+11 7.6392e+11 29592  29.4695 < 2.2e-16 ***
## - OverallQual_factor  9 1.3185e+11 7.9198e+11 29641  29.1166 < 2.2e-16 ***
## - X2ndFlrSF           1 1.5169e+11 8.1182e+11 29693 301.4730 < 2.2e-16 ***
## - RoofMatl            7 3.1082e+11 9.7095e+11 29942  88.2490 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29391.97
## SalePrice ~ MSZoning + LotArea + Street + LandContour + Utilities + 
##     LotConfig + LandSlope + Neighborhood + Condition1 + Condition2 + 
##     BldgType + OverallCond + YearBuilt + YearRemodAdd + RoofStyle + 
##     RoofMatl + Exterior1st + ExterQual + Foundation + BsmtFinSF1 + 
##     BsmtFinSF2 + BsmtUnfSF + X1stFlrSF + X2ndFlrSF + BsmtFullBath + 
##     FullBath + BedroomAbvGr + KitchenAbvGr + KitchenQual + TotRmsAbvGrd + 
##     Functional + Fireplaces + GarageCars + GarageArea + WoodDeckSF + 
##     OpenPorchSF + EnclosedPorch + X3SsnPorch + ScreenPorch + 
##     PoolArea + MoSold + SaleType + OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - OpenPorchSF         1 4.8455e+08 6.6465e+11 29391   0.9608 0.3271574    
## - BsmtFullBath        1 5.6710e+08 6.6473e+11 29391   1.1245 0.2891370    
## - TotRmsAbvGrd        1 5.9559e+08 6.6476e+11 29391   1.1810 0.2773474    
## - Utilities           1 7.8551e+08 6.6495e+11 29392   1.5576 0.2122334    
## - ExterQual           3 2.7186e+09 6.6688e+11 29392   1.7970 0.1458733    
## <none>                             6.6416e+11 29392                       
## - EnclosedPorch       1 9.6192e+08 6.6512e+11 29392   1.9074 0.1674811    
## - GarageCars          1 9.6712e+08 6.6513e+11 29392   1.9178 0.1663381    
## - WoodDeckSF          1 1.0551e+09 6.6522e+11 29392   2.0923 0.1482824    
## - Exterior1st        14 1.3373e+10 6.7753e+11 29393   1.8941 0.0231980 *  
## - FullBath            1 1.5599e+09 6.6572e+11 29393   3.0932 0.0788507 .  
## - YearRemodAdd        1 1.8132e+09 6.6597e+11 29394   3.5954 0.0581574 .  
## - Foundation          5 6.0207e+09 6.7018e+11 29395   2.3878 0.0362043 *  
## - X3SsnPorch          1 2.5610e+09 6.6672e+11 29396   5.0784 0.0243893 *  
## - GarageArea          1 2.8742e+09 6.6704e+11 29396   5.6995 0.0171106 *  
## - MoSold              1 3.1030e+09 6.6726e+11 29397   6.1531 0.0132424 *  
## - LotConfig           4 6.4345e+09 6.7060e+11 29398   3.1898 0.0127971 *  
## - LandContour         3 5.5581e+09 6.6972e+11 29398   3.6738 0.0118358 *  
## - RoofStyle           5 7.4843e+09 6.7165e+11 29398   2.9682 0.0113695 *  
## - MSZoning            4 6.6699e+09 6.7083e+11 29399   3.3065 0.0104735 *  
## - Street              1 4.2016e+09 6.6836e+11 29399   8.3317 0.0039596 ** 
## - Fireplaces          1 4.5070e+09 6.6867e+11 29400   8.9372 0.0028461 ** 
## - BedroomAbvGr        1 5.0227e+09 6.6918e+11 29401   9.9597 0.0016363 ** 
## - ScreenPorch         1 5.9050e+09 6.7007e+11 29403  11.7093 0.0006410 ***
## - KitchenAbvGr        1 6.1788e+09 6.7034e+11 29404  12.2522 0.0004802 ***
## - PoolArea            1 7.1176e+09 6.7128e+11 29406  14.1138 0.0001796 ***
## - BsmtUnfSF           1 7.3377e+09 6.7150e+11 29406  14.5503 0.0001428 ***
## - Condition1          8 1.5011e+10 6.7917e+11 29409   3.7208 0.0002588 ***
## - KitchenQual         3 1.0385e+10 6.7455e+11 29409   6.8644 0.0001375 ***
## - BsmtFinSF2          1 1.0475e+10 6.7464e+11 29413  20.7713 5.655e-06 ***
## - LandSlope           2 1.2617e+10 6.7678e+11 29416  12.5098 4.150e-06 ***
## - BldgType            4 1.6731e+10 6.8089e+11 29420   8.2944 1.318e-06 ***
## - Functional          6 2.1319e+10 6.8548e+11 29426   7.0457 2.133e-07 ***
## - YearBuilt           1 2.4675e+10 6.8884e+11 29443  48.9302 4.208e-12 ***
## - LotArea             1 3.1028e+10 6.9519e+11 29457  61.5267 8.970e-15 ***
## - SaleType            8 3.8229e+10 7.0239e+11 29458   9.4759 8.294e-13 ***
## - BsmtFinSF1          1 3.8717e+10 7.0288e+11 29473  76.7732 < 2.2e-16 ***
## - OverallCond         1 4.0562e+10 7.0472e+11 29477  80.4320 < 2.2e-16 ***
## - Neighborhood       24 8.5712e+10 7.4987e+11 29521   7.0818 < 2.2e-16 ***
## - X1stFlrSF           1 7.0603e+10 7.3476e+11 29538 140.0018 < 2.2e-16 ***
## - Condition2          7 1.0531e+11 7.6948e+11 29593  29.8333 < 2.2e-16 ***
## - OverallQual_factor  9 1.3166e+11 7.9582e+11 29638  29.0079 < 2.2e-16 ***
## - X2ndFlrSF           1 1.5325e+11 8.1741e+11 29693 303.8867 < 2.2e-16 ***
## - RoofMatl            7 3.1139e+11 9.7555e+11 29939  88.2090 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29391.04
## SalePrice ~ MSZoning + LotArea + Street + LandContour + Utilities + 
##     LotConfig + LandSlope + Neighborhood + Condition1 + Condition2 + 
##     BldgType + OverallCond + YearBuilt + YearRemodAdd + RoofStyle + 
##     RoofMatl + Exterior1st + ExterQual + Foundation + BsmtFinSF1 + 
##     BsmtFinSF2 + BsmtUnfSF + X1stFlrSF + X2ndFlrSF + BsmtFullBath + 
##     FullBath + BedroomAbvGr + KitchenAbvGr + KitchenQual + TotRmsAbvGrd + 
##     Functional + Fireplaces + GarageCars + GarageArea + WoodDeckSF + 
##     EnclosedPorch + X3SsnPorch + ScreenPorch + PoolArea + MoSold + 
##     SaleType + OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - TotRmsAbvGrd        1 6.1094e+08 6.6526e+11 29390   1.2115 0.2712354    
## - BsmtFullBath        1 6.3187e+08 6.6528e+11 29390   1.2530 0.2631845    
## - Utilities           1 7.2591e+08 6.6537e+11 29391   1.4395 0.2304364    
## - EnclosedPorch       1 8.7335e+08 6.6552e+11 29391   1.7319 0.1884033    
## - ExterQual           3 2.7227e+09 6.6737e+11 29391   1.7997 0.1453555    
## <none>                             6.6465e+11 29391                       
## - GarageCars          1 9.3400e+08 6.6558e+11 29391   1.8521 0.1737683    
## - WoodDeckSF          1 9.7338e+08 6.6562e+11 29391   1.9302 0.1649681    
## - Exterior1st        14 1.3172e+10 6.7782e+11 29392   1.8657 0.0260247 *  
## - FullBath            1 1.5564e+09 6.6620e+11 29393   3.0864 0.0791829 .  
## - YearRemodAdd        1 1.8284e+09 6.6647e+11 29393   3.6258 0.0571066 .  
## - X3SsnPorch          1 2.4987e+09 6.6714e+11 29395   4.9549 0.0261851 *  
## - Foundation          5 6.2212e+09 6.7087e+11 29395   2.4673 0.0309835 *  
## - GarageArea          1 2.8738e+09 6.6752e+11 29395   5.6989 0.0171162 *  
## - MoSold              1 2.9520e+09 6.6760e+11 29396   5.8538 0.0156782 *  
## - LotConfig           4 6.3710e+09 6.7102e+11 29397   3.1584 0.0135031 *  
## - LandContour         3 5.4958e+09 6.7014e+11 29397   3.6328 0.0125213 *  
## - RoofStyle           5 7.3553e+09 6.7200e+11 29397   2.9171 0.0126128 *  
## - MSZoning            4 6.5019e+09 6.7115e+11 29397   3.2233 0.0120825 *  
## - Street              1 4.1087e+09 6.6875e+11 29398   8.1476 0.0043793 ** 
## - Fireplaces          1 4.6186e+09 6.6926e+11 29399   9.1587 0.0025234 ** 
## - BedroomAbvGr        1 5.1246e+09 6.6977e+11 29400  10.1621 0.0014673 ** 
## - ScreenPorch         1 5.9884e+09 6.7063e+11 29402  11.8751 0.0005868 ***
## - KitchenAbvGr        1 6.2414e+09 6.7089e+11 29403  12.3769 0.0004495 ***
## - PoolArea            1 7.0953e+09 6.7174e+11 29405  14.0701 0.0001838 ***
## - BsmtUnfSF           1 7.5837e+09 6.7223e+11 29406  15.0385 0.0001105 ***
## - Condition1          8 1.4975e+10 6.7962e+11 29408   3.7118 0.0002663 ***
## - KitchenQual         3 1.0379e+10 6.7503e+11 29408   6.8608 0.0001382 ***
## - BsmtFinSF2          1 1.0720e+10 6.7537e+11 29412  21.2578 4.405e-06 ***
## - LandSlope           2 1.2944e+10 6.7759e+11 29415  12.8336 3.020e-06 ***
## - BldgType            4 1.6704e+10 6.8135e+11 29419   8.2810 1.351e-06 ***
## - Functional          6 2.1248e+10 6.8589e+11 29425   7.0225 2.268e-07 ***
## - YearBuilt           1 2.4736e+10 6.8938e+11 29442  49.0518 3.963e-12 ***
## - LotArea             1 3.1383e+10 6.9603e+11 29456  62.2330 6.365e-15 ***
## - SaleType            8 3.8265e+10 7.0291e+11 29457   9.4851 8.026e-13 ***
## - BsmtFinSF1          1 3.9072e+10 7.0372e+11 29472  77.4795 < 2.2e-16 ***
## - OverallCond         1 4.0745e+10 7.0539e+11 29476  80.7980 < 2.2e-16 ***
## - Neighborhood       24 8.5237e+10 7.4988e+11 29519   7.0428 < 2.2e-16 ***
## - X1stFlrSF           1 7.1386e+10 7.3603e+11 29538 141.5587 < 2.2e-16 ***
## - Condition2          7 1.0514e+11 7.6979e+11 29592  29.7849 < 2.2e-16 ***
## - OverallQual_factor  9 1.3197e+11 7.9661e+11 29638  29.0769 < 2.2e-16 ***
## - X2ndFlrSF           1 1.5775e+11 8.2240e+11 29700 312.8242 < 2.2e-16 ***
## - RoofMatl            7 3.1112e+11 9.7576e+11 29938  88.1356 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29390.38
## SalePrice ~ MSZoning + LotArea + Street + LandContour + Utilities + 
##     LotConfig + LandSlope + Neighborhood + Condition1 + Condition2 + 
##     BldgType + OverallCond + YearBuilt + YearRemodAdd + RoofStyle + 
##     RoofMatl + Exterior1st + ExterQual + Foundation + BsmtFinSF1 + 
##     BsmtFinSF2 + BsmtUnfSF + X1stFlrSF + X2ndFlrSF + BsmtFullBath + 
##     FullBath + BedroomAbvGr + KitchenAbvGr + KitchenQual + Functional + 
##     Fireplaces + GarageCars + GarageArea + WoodDeckSF + EnclosedPorch + 
##     X3SsnPorch + ScreenPorch + PoolArea + MoSold + SaleType + 
##     OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - Utilities           1 6.9628e+08 6.6595e+11 29390   1.3805 0.2402257    
## - BsmtFullBath        1 7.1183e+08 6.6597e+11 29390   1.4113 0.2350489    
## - EnclosedPorch       1 7.7213e+08 6.6603e+11 29390   1.5309 0.2161987    
## <none>                             6.6526e+11 29390                       
## - WoodDeckSF          1 9.6563e+08 6.6622e+11 29391   1.9145 0.1666940    
## - GarageCars          1 9.9457e+08 6.6625e+11 29391   1.9719 0.1604787    
## - ExterQual           3 2.9065e+09 6.6816e+11 29391   1.9209 0.1243042    
## - Exterior1st        14 1.3111e+10 6.7837e+11 29391   1.8567 0.0269819 *  
## - FullBath            1 1.5409e+09 6.6680e+11 29392   3.0551 0.0807188 .  
## - YearRemodAdd        1 1.8889e+09 6.6715e+11 29393   3.7451 0.0531767 .  
## - X3SsnPorch          1 2.4384e+09 6.6770e+11 29394   4.8346 0.0280671 *  
## - Foundation          5 6.3846e+09 6.7164e+11 29394   2.5317 0.0272922 *  
## - GarageArea          1 2.7994e+09 6.6806e+11 29395   5.5503 0.0186228 *  
## - MoSold              1 3.1750e+09 6.6843e+11 29395   6.2950 0.0122272 *  
## - RoofStyle           5 7.2551e+09 6.7251e+11 29396   2.8769 0.0136822 *  
## - LotConfig           4 6.3517e+09 6.7161e+11 29396   3.1484 0.0137376 *  
## - LandContour         3 5.4497e+09 6.7071e+11 29396   3.6017 0.0130656 *  
## - MSZoning            4 6.4346e+09 6.7169e+11 29396   3.1894 0.0128048 *  
## - Street              1 4.2228e+09 6.6948e+11 29398   8.3726 0.0038719 ** 
## - BedroomAbvGr        1 4.5563e+09 6.6981e+11 29398   9.0337 0.0027005 ** 
## - Fireplaces          1 4.6719e+09 6.6993e+11 29399   9.2630 0.0023845 ** 
## - KitchenAbvGr        1 5.6966e+09 6.7095e+11 29401  11.2946 0.0007996 ***
## - ScreenPorch         1 5.8925e+09 6.7115e+11 29401  11.6830 0.0006500 ***
## - PoolArea            1 6.9195e+09 6.7218e+11 29404  13.7193 0.0002210 ***
## - BsmtUnfSF           1 7.2851e+09 6.7254e+11 29404  14.4441 0.0001510 ***
## - Condition1          8 1.5082e+10 6.8034e+11 29407   3.7379 0.0002450 ***
## - KitchenQual         3 1.0565e+10 6.7582e+11 29407   6.9825 0.0001164 ***
## - BsmtFinSF2          1 1.0476e+10 6.7573e+11 29411  20.7704 5.657e-06 ***
## - LandSlope           2 1.2977e+10 6.7823e+11 29415  12.8651 2.928e-06 ***
## - BldgType            4 1.8428e+10 6.8368e+11 29422   9.1344 2.802e-07 ***
## - Functional          6 2.1248e+10 6.8650e+11 29424   7.0213 2.275e-07 ***
## - YearBuilt           1 2.4334e+10 6.8959e+11 29441  48.2478 5.882e-12 ***
## - LotArea             1 3.1616e+10 6.9687e+11 29456  62.6841 5.112e-15 ***
## - SaleType            8 3.8938e+10 7.0420e+11 29457   9.6504 4.503e-13 ***
## - BsmtFinSF1          1 3.8473e+10 7.0373e+11 29471  76.2794 < 2.2e-16 ***
## - OverallCond         1 4.0552e+10 7.0581e+11 29475  80.4021 < 2.2e-16 ***
## - Neighborhood       24 8.5185e+10 7.5044e+11 29518   7.0373 < 2.2e-16 ***
## - X1stFlrSF           1 8.9561e+10 7.5482e+11 29573 177.5711 < 2.2e-16 ***
## - Condition2          7 1.0673e+11 7.7199e+11 29594  30.2303 < 2.2e-16 ***
## - OverallQual_factor  9 1.3277e+11 7.9803e+11 29638  29.2491 < 2.2e-16 ***
## - X2ndFlrSF           1 2.3844e+11 9.0369e+11 29836 472.7455 < 2.2e-16 ***
## - RoofMatl            7 3.1159e+11 9.7684e+11 29937  88.2545 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29389.91
## SalePrice ~ MSZoning + LotArea + Street + LandContour + LotConfig + 
##     LandSlope + Neighborhood + Condition1 + Condition2 + BldgType + 
##     OverallCond + YearBuilt + YearRemodAdd + RoofStyle + RoofMatl + 
##     Exterior1st + ExterQual + Foundation + BsmtFinSF1 + BsmtFinSF2 + 
##     BsmtUnfSF + X1stFlrSF + X2ndFlrSF + BsmtFullBath + FullBath + 
##     BedroomAbvGr + KitchenAbvGr + KitchenQual + Functional + 
##     Fireplaces + GarageCars + GarageArea + WoodDeckSF + EnclosedPorch + 
##     X3SsnPorch + ScreenPorch + PoolArea + MoSold + SaleType + 
##     OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - BsmtFullBath        1 7.4693e+08 6.6670e+11 29390   1.4805 0.2239133    
## - EnclosedPorch       1 7.8152e+08 6.6673e+11 29390   1.5491 0.2134938    
## <none>                             6.6595e+11 29390                       
## - WoodDeckSF          1 9.7408e+08 6.6693e+11 29390   1.9307 0.1649109    
## - GarageCars          1 9.9378e+08 6.6695e+11 29390   1.9698 0.1607045    
## - ExterQual           3 2.8962e+09 6.6885e+11 29390   1.9135 0.1254951    
## - Exterior1st        14 1.3186e+10 6.7914e+11 29391   1.8669 0.0258955 *  
## - FullBath            1 1.6311e+09 6.6758e+11 29392   3.2331 0.0723934 .  
## - YearRemodAdd        1 2.0081e+09 6.6796e+11 29392   3.9803 0.0462393 *  
## - X3SsnPorch          1 2.4216e+09 6.6837e+11 29393   4.7999 0.0286363 *  
## - Foundation          5 6.3637e+09 6.7232e+11 29394   2.5227 0.0277823 *  
## - GarageArea          1 2.7979e+09 6.6875e+11 29394   5.5458 0.0186711 *  
## - MoSold              1 3.0334e+09 6.6899e+11 29395   6.0127 0.0143323 *  
## - LotConfig           4 6.0410e+09 6.7199e+11 29395   2.9935 0.0178876 *  
## - RoofStyle           5 7.2140e+09 6.7317e+11 29396   2.8598 0.0141645 *  
## - LandContour         3 5.4136e+09 6.7137e+11 29396   3.5768 0.0135196 *  
## - MSZoning            4 6.4047e+09 6.7236e+11 29396   3.1737 0.0131541 *  
## - Street              1 4.1489e+09 6.7010e+11 29397   8.2237 0.0042005 ** 
## - BedroomAbvGr        1 4.6409e+09 6.7059e+11 29398   9.1988 0.0024690 ** 
## - Fireplaces          1 4.6559e+09 6.7061e+11 29398   9.2287 0.0024293 ** 
## - ScreenPorch         1 5.5388e+09 6.7149e+11 29400  10.9786 0.0009467 ***
## - KitchenAbvGr        1 5.7236e+09 6.7168e+11 29400  11.3449 0.0007784 ***
## - PoolArea            1 6.9392e+09 6.7289e+11 29403  13.7543 0.0002170 ***
## - BsmtUnfSF           1 7.6155e+09 6.7357e+11 29405  15.0948 0.0001073 ***
## - Condition1          8 1.4995e+10 6.8095e+11 29406   3.7152 0.0002633 ***
## - KitchenQual         3 1.0566e+10 6.7652e+11 29407   6.9813 0.0001165 ***
## - BsmtFinSF2          1 1.0465e+10 6.7642e+11 29411  20.7422 5.740e-06 ***
## - LandSlope           2 1.2906e+10 6.7886e+11 29414  12.7902 3.151e-06 ***
## - BldgType            4 1.8338e+10 6.8429e+11 29422   9.0870 3.058e-07 ***
## - Functional          6 2.1265e+10 6.8722e+11 29424   7.0249 2.253e-07 ***
## - YearBuilt           1 2.4739e+10 6.9069e+11 29441  49.0365 3.990e-12 ***
## - LotArea             1 3.1830e+10 6.9778e+11 29456  63.0915 4.193e-15 ***
## - SaleType            8 3.9065e+10 7.0502e+11 29457   9.6789 4.073e-13 ***
## - BsmtFinSF1          1 3.9233e+10 7.0519e+11 29472  77.7648 < 2.2e-16 ***
## - OverallCond         1 4.0433e+10 7.0639e+11 29474  80.1440 < 2.2e-16 ***
## - Neighborhood       24 8.4870e+10 7.5082e+11 29517   7.0092 < 2.2e-16 ***
## - X1stFlrSF           1 8.9057e+10 7.5501e+11 29571 176.5224 < 2.2e-16 ***
## - Condition2          7 1.0695e+11 7.7290e+11 29593  30.2843 < 2.2e-16 ***
## - OverallQual_factor  9 1.3288e+11 7.9883e+11 29638  29.2648 < 2.2e-16 ***
## - X2ndFlrSF           1 2.3936e+11 9.0532e+11 29836 474.4497 < 2.2e-16 ***
## - RoofMatl            7 3.1299e+11 9.7894e+11 29938  88.6259 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29389.54
## SalePrice ~ MSZoning + LotArea + Street + LandContour + LotConfig + 
##     LandSlope + Neighborhood + Condition1 + Condition2 + BldgType + 
##     OverallCond + YearBuilt + YearRemodAdd + RoofStyle + RoofMatl + 
##     Exterior1st + ExterQual + Foundation + BsmtFinSF1 + BsmtFinSF2 + 
##     BsmtUnfSF + X1stFlrSF + X2ndFlrSF + FullBath + BedroomAbvGr + 
##     KitchenAbvGr + KitchenQual + Functional + Fireplaces + GarageCars + 
##     GarageArea + WoodDeckSF + EnclosedPorch + X3SsnPorch + ScreenPorch + 
##     PoolArea + MoSold + SaleType + OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## - EnclosedPorch       1 8.6788e+08 6.6757e+11 29389   1.7196 0.1899705    
## <none>                             6.6670e+11 29390                       
## - GarageCars          1 9.7414e+08 6.6767e+11 29390   1.9302 0.1649758    
## - ExterQual           3 2.8259e+09 6.6953e+11 29390   1.8664 0.1333857    
## - WoodDeckSF          1 1.0432e+09 6.6774e+11 29390   2.0670 0.1507544    
## - Exterior1st        14 1.3090e+10 6.7979e+11 29390   1.8526 0.0274293 *  
## - FullBath            1 1.3788e+09 6.6808e+11 29391   2.7320 0.0985965 .  
## - YearRemodAdd        1 2.1739e+09 6.6887e+11 29392   4.3074 0.0381395 *  
## - X3SsnPorch          1 2.4291e+09 6.6913e+11 29393   4.8131 0.0284177 *  
## - Foundation          5 6.5472e+09 6.7325e+11 29394   2.5945 0.0241020 *  
## - GarageArea          1 2.8945e+09 6.6959e+11 29394   5.7352 0.0167671 *  
## - MoSold              1 3.0477e+09 6.6975e+11 29394   6.0388 0.0141227 *  
## - LotConfig           4 5.9971e+09 6.7270e+11 29395   2.9707 0.0185939 *  
## - RoofStyle           5 7.2835e+09 6.7398e+11 29395   2.8863 0.0134245 *  
## - LandContour         3 5.5732e+09 6.7227e+11 29396   3.6809 0.0117201 *  
## - MSZoning            4 6.5230e+09 6.7322e+11 29396   3.2312 0.0119206 *  
## - Street              1 4.0593e+09 6.7076e+11 29396   8.0432 0.0046372 ** 
## - BedroomAbvGr        1 4.6518e+09 6.7135e+11 29398   9.2172 0.0024445 ** 
## - Fireplaces          1 4.6984e+09 6.7140e+11 29398   9.3094 0.0023253 ** 
## - ScreenPorch         1 5.4653e+09 6.7217e+11 29400  10.8290 0.0010256 ** 
## - KitchenAbvGr        1 5.6844e+09 6.7238e+11 29400  11.2631 0.0008131 ***
## - PoolArea            1 6.9753e+09 6.7368e+11 29403  13.8209 0.0002095 ***
## - BsmtUnfSF           1 7.5111e+09 6.7421e+11 29404  14.8826 0.0001199 ***
## - Condition1          8 1.4819e+10 6.8152e+11 29406   3.6702 0.0003038 ***
## - KitchenQual         3 1.0610e+10 6.7731e+11 29407   7.0075 0.0001123 ***
## - LandSlope           2 1.2856e+10 6.7956e+11 29413  12.7364 3.321e-06 ***
## - BsmtFinSF2          1 1.2208e+10 6.7891e+11 29414  24.1886 9.832e-07 ***
## - BldgType            4 1.8018e+10 6.8472e+11 29421   8.9254 4.119e-07 ***
## - Functional          6 2.1458e+10 6.8816e+11 29424   7.0863 1.915e-07 ***
## - YearBuilt           1 2.4860e+10 6.9156e+11 29441  49.2568 3.579e-12 ***
## - SaleType            8 3.8824e+10 7.0552e+11 29456   9.6158 5.073e-13 ***
## - LotArea             1 3.2248e+10 6.9895e+11 29457  63.8963 2.838e-15 ***
## - OverallCond         1 4.0101e+10 7.0680e+11 29473  79.4562 < 2.2e-16 ***
## - BsmtFinSF1          1 4.8155e+10 7.1486e+11 29489  95.4153 < 2.2e-16 ***
## - Neighborhood       24 8.4430e+10 7.5113e+11 29516   6.9704 < 2.2e-16 ***
## - X1stFlrSF           1 8.8813e+10 7.5551e+11 29570 175.9747 < 2.2e-16 ***
## - Condition2          7 1.0828e+11 7.7498e+11 29595  30.6501 < 2.2e-16 ***
## - OverallQual_factor  9 1.3254e+11 7.9924e+11 29636  29.1793 < 2.2e-16 ***
## - X2ndFlrSF           1 2.3879e+11 9.0549e+11 29835 473.1379 < 2.2e-16 ***
## - RoofMatl            7 3.2349e+11 9.9019e+11 29953  91.5674 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Step:  AIC=29389.44
## SalePrice ~ MSZoning + LotArea + Street + LandContour + LotConfig + 
##     LandSlope + Neighborhood + Condition1 + Condition2 + BldgType + 
##     OverallCond + YearBuilt + YearRemodAdd + RoofStyle + RoofMatl + 
##     Exterior1st + ExterQual + Foundation + BsmtFinSF1 + BsmtFinSF2 + 
##     BsmtUnfSF + X1stFlrSF + X2ndFlrSF + FullBath + BedroomAbvGr + 
##     KitchenAbvGr + KitchenQual + Functional + Fireplaces + GarageCars + 
##     GarageArea + WoodDeckSF + X3SsnPorch + ScreenPorch + PoolArea + 
##     MoSold + SaleType + OverallQual_factor
## 
##                      Df  Sum of Sq        RSS   AIC  F value    Pr(>F)    
## <none>                             6.6757e+11 29389                       
## - WoodDeckSF          1 9.2289e+08 6.6849e+11 29390   1.8276 0.1766402    
## - GarageCars          1 9.3355e+08 6.6850e+11 29390   1.8487 0.1741621    
## - Exterior1st        14 1.2982e+10 6.8055e+11 29390   1.8364 0.0292766 *  
## - ExterQual           3 2.8940e+09 6.7046e+11 29390   1.9104 0.1260089    
## - FullBath            1 1.4318e+09 6.6900e+11 29391   2.8355 0.0924370 .  
## - YearRemodAdd        1 2.2335e+09 6.6980e+11 29392   4.4231 0.0356447 *  
## - X3SsnPorch          1 2.3282e+09 6.6990e+11 29393   4.6106 0.0319561 *  
## - Foundation          5 6.5914e+09 6.7416e+11 29394   2.6106 0.0233431 *  
## - GarageArea          1 3.0162e+09 6.7058e+11 29394   5.9731 0.0146560 *  
## - MoSold              1 3.1725e+09 6.7074e+11 29394   6.2825 0.0123127 *  
## - LotConfig           4 6.0322e+09 6.7360e+11 29395   2.9864 0.0181031 *  
## - RoofStyle           5 7.2719e+09 6.7484e+11 29395   2.8802 0.0135929 *  
## - MSZoning            4 6.4439e+09 6.7401e+11 29396   3.1903 0.0127864 *  
## - LandContour         3 5.5799e+09 6.7315e+11 29396   3.6833 0.0116817 *  
## - Street              1 4.1824e+09 6.7175e+11 29397   8.2825 0.0040672 ** 
## - BedroomAbvGr        1 4.6943e+09 6.7226e+11 29398   9.2963 0.0023418 ** 
## - Fireplaces          1 4.7357e+09 6.7230e+11 29398   9.3782 0.0022401 ** 
## - ScreenPorch         1 4.9930e+09 6.7256e+11 29398   9.8878 0.0017008 ** 
## - KitchenAbvGr        1 5.7187e+09 6.7329e+11 29400  11.3248 0.0007867 ***
## - PoolArea            1 7.3984e+09 6.7497e+11 29404  14.6512 0.0001354 ***
## - BsmtUnfSF           1 7.7164e+09 6.7528e+11 29404  15.2810 9.734e-05 ***
## - Condition1          8 1.4651e+10 6.8222e+11 29405   3.6266 0.0003488 ***
## - KitchenQual         3 1.0642e+10 6.7821e+11 29407   7.0251 0.0001095 ***
## - LandSlope           2 1.2846e+10 6.8041e+11 29413  12.7193 3.377e-06 ***
## - BsmtFinSF2          1 1.2609e+10 6.8018e+11 29415  24.9699 6.603e-07 ***
## - BldgType            4 1.8185e+10 6.8575e+11 29421   9.0029 3.570e-07 ***
## - Functional          6 2.1596e+10 6.8916e+11 29424   7.1278 1.715e-07 ***
## - YearBuilt           1 2.3993e+10 6.9156e+11 29439  47.5136 8.435e-12 ***
## - SaleType            8 3.8679e+10 7.0625e+11 29456   9.5747 5.853e-13 ***
## - LotArea             1 3.2077e+10 6.9964e+11 29456  63.5230 3.399e-15 ***
## - OverallCond         1 3.9276e+10 7.0684e+11 29471  77.7799 < 2.2e-16 ***
## - BsmtFinSF1          1 4.8771e+10 7.1634e+11 29490  96.5830 < 2.2e-16 ***
## - Neighborhood       24 8.5199e+10 7.5277e+11 29517   7.0301 < 2.2e-16 ***
## - X1stFlrSF           1 8.8281e+10 7.5585e+11 29569 174.8248 < 2.2e-16 ***
## - Condition2          7 1.0834e+11 7.7591e+11 29595  30.6500 < 2.2e-16 ***
## - OverallQual_factor  9 1.3213e+11 7.9970e+11 29635  29.0733 < 2.2e-16 ***
## - X2ndFlrSF           1 2.3847e+11 9.0604e+11 29833 472.2498 < 2.2e-16 ***
## - RoofMatl            7 3.2481e+11 9.9238e+11 29954  91.8894 < 2.2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = SalePrice ~ MSZoning + LotArea + Street + LandContour + 
##     LotConfig + LandSlope + Neighborhood + Condition1 + Condition2 + 
##     BldgType + OverallCond + YearBuilt + YearRemodAdd + RoofStyle + 
##     RoofMatl + Exterior1st + ExterQual + Foundation + BsmtFinSF1 + 
##     BsmtFinSF2 + BsmtUnfSF + X1stFlrSF + X2ndFlrSF + FullBath + 
##     BedroomAbvGr + KitchenAbvGr + KitchenQual + Functional + 
##     Fireplaces + GarageCars + GarageArea + WoodDeckSF + X3SsnPorch + 
##     ScreenPorch + PoolArea + MoSold + SaleType + OverallQual_factor, 
##     data = house.train.df)
## 
## Coefficients:
##          (Intercept)            MSZoningFV            MSZoningRH  
##           -1.766e+06             3.409e+04             2.996e+04  
##           MSZoningRL            MSZoningRM               LotArea  
##            3.249e+04             3.198e+04             7.501e-01  
##           StreetPave        LandContourHLS        LandContourLow  
##            3.263e+04             9.322e+03            -6.470e+03  
##       LandContourLvl      LotConfigCulDSac          LotConfigFR2  
##            7.083e+03             6.409e+03            -5.890e+03  
##         LotConfigFR3       LotConfigInside          LandSlopeMod  
##           -1.584e+04            -1.078e+03             1.067e+04  
##         LandSlopeSev   NeighborhoodBlueste    NeighborhoodBrDale  
##           -3.505e+04            -9.886e+03            -3.845e+02  
##  NeighborhoodBrkSide   NeighborhoodClearCr   NeighborhoodCollgCr  
##           -4.322e+03            -6.486e+03            -9.438e+03  
##  NeighborhoodCrawfor   NeighborhoodEdwards   NeighborhoodGilbert  
##            9.021e+03            -1.755e+04            -1.305e+04  
##   NeighborhoodIDOTRR   NeighborhoodMeadowV   NeighborhoodMitchel  
##           -8.082e+03            -1.671e+04            -1.806e+04  
##    NeighborhoodNAmes   NeighborhoodNoRidge   NeighborhoodNPkVill  
##           -1.458e+04             2.161e+04             4.660e+03  
##  NeighborhoodNridgHt    NeighborhoodNWAmes   NeighborhoodOldTown  
##            1.425e+04            -1.897e+04            -1.580e+04  
##   NeighborhoodSawyer   NeighborhoodSawyerW   NeighborhoodSomerst  
##           -1.289e+04            -5.760e+03            -2.111e+03  
##  NeighborhoodStoneBr     NeighborhoodSWISU    NeighborhoodTimber  
##            2.863e+04            -7.771e+03            -7.903e+03  
##  NeighborhoodVeenker       Condition1Feedr        Condition1Norm  
##           -2.802e+02             4.697e+03             1.248e+04  
##       Condition1PosA        Condition1PosN        Condition1RRAe  
##            1.165e+04             8.771e+03            -1.248e+04  
##       Condition1RRAn        Condition1RRNe        Condition1RRNn  
##            8.359e+03            -9.185e+03             7.794e+03  
##      Condition2Feedr        Condition2Norm        Condition2PosA  
##            1.161e+03            -7.005e+02            -3.382e+04  
##       Condition2PosN        Condition2RRAe        Condition2RRAn  
##           -2.714e+05            -1.217e+05            -8.921e+03  
##       Condition2RRNn        BldgType2fmCon        BldgTypeDuplex  
##           -1.453e+03            -6.151e+03            -6.273e+02  
##        BldgTypeTwnhs        BldgTypeTwnhsE           OverallCond  
##           -2.264e+04            -1.870e+04             6.710e+03  
##            YearBuilt          YearRemodAdd        RoofStyleGable  
##            4.189e+02             1.039e+02            -1.224e+02  
##     RoofStyleGambrel          RoofStyleHip      RoofStyleMansard  
##            5.222e+03             1.985e+03             1.604e+04  
##        RoofStyleShed       RoofMatlCompShg       RoofMatlMembran  
##            9.789e+04             7.019e+05             7.879e+05  
##        RoofMatlMetal          RoofMatlRoll       RoofMatlTar&Grv  
##            7.587e+05             7.068e+05             7.068e+05  
##      RoofMatlWdShake       RoofMatlWdShngl    Exterior1stAsphShn  
##            6.834e+05             7.564e+05            -1.163e+03  
##   Exterior1stBrkComm    Exterior1stBrkFace     Exterior1stCBlock  
##           -4.933e+03             1.519e+04            -1.619e+04  
##   Exterior1stCemntBd    Exterior1stHdBoard    Exterior1stImStucc  
##            3.994e+03            -1.699e+03            -2.686e+04  
##   Exterior1stMetalSd    Exterior1stPlywood      Exterior1stStone  
##            4.280e+03            -2.776e+03            -1.000e+04  
##    Exterior1stStucco    Exterior1stVinylSd    Exterior1stWd Sdng  
##            5.024e+03             2.240e+03             2.779e+03  
##   Exterior1stWdShing           ExterQualFa           ExterQualGd  
##            1.314e+03             5.869e+03            -8.036e+03  
##          ExterQualTA      FoundationCBlock       FoundationPConc  
##           -8.937e+03            -7.952e+02             3.530e+03  
##       FoundationSlab       FoundationStone        FoundationWood  
##            2.013e+03             8.802e+03            -3.756e+04  
##           BsmtFinSF1            BsmtFinSF2             BsmtUnfSF  
##            3.556e+01             2.554e+01             1.395e+01  
##            X1stFlrSF             X2ndFlrSF              FullBath  
##            5.702e+01             5.788e+01             3.168e+03  
##         BedroomAbvGr          KitchenAbvGr         KitchenQualFa  
##           -3.483e+03            -1.647e+04            -1.277e+04  
##        KitchenQualGd         KitchenQualTA        FunctionalMaj2  
##           -1.561e+04            -1.466e+04             4.227e+03  
##       FunctionalMin1        FunctionalMin2         FunctionalMod  
##            7.786e+03             9.976e+03             4.993e+03  
##        FunctionalSev         FunctionalTyp            Fireplaces  
##           -6.967e+04             2.151e+04             3.854e+03  
##           GarageCars            GarageArea            WoodDeckSF  
##            2.757e+03             1.698e+01             7.420e+00  
##           X3SsnPorch           ScreenPorch              PoolArea  
##            4.615e+01             3.581e+01             6.265e+01  
##               MoSold           SaleTypeCon         SaleTypeConLD  
##           -5.809e+02             3.795e+04             2.164e+04  
##        SaleTypeConLI         SaleTypeConLw           SaleTypeCWD  
##            7.863e+02             4.900e+03             1.247e+04  
##          SaleTypeNew           SaleTypeOth            SaleTypeWD  
##            2.582e+04             8.910e+03             4.154e+03  
## OverallQual_factor10   OverallQual_factor2   OverallQual_factor3  
##            1.034e+05            -1.873e+04            -2.273e+04  
##  OverallQual_factor4   OverallQual_factor5   OverallQual_factor6  
##           -2.335e+04            -2.288e+04            -2.154e+04  
##  OverallQual_factor7   OverallQual_factor8   OverallQual_factor9  
##           -1.430e+04             5.454e+03             4.724e+04

Backward elimination selected 39 independent variables, Some are quantitative and some are categorical.

regressor <- lm(formula = SalePrice ~ MSZoning + LotArea + Street + LandContour + 
    LotConfig + LandSlope + Neighborhood + Condition1 + Condition2 + 
    BldgType + HouseStyle + OverallQual + OverallCond + YearBuilt + 
    YearRemodAdd + RoofStyle + RoofMatl + ExterQual + Foundation + 
    BsmtFinSF1 + BsmtFinSF2 + BsmtUnfSF + X1stFlrSF + X2ndFlrSF + 
    FullBath + BedroomAbvGr + KitchenAbvGr + KitchenQual + TotRmsAbvGrd + 
    Functional + Fireplaces + GarageCars + GarageArea + WoodDeckSF + 
    ScreenPorch + PoolArea + MoSold + SaleType, data = house.train.df)

summary(regressor)
## 
## Call:
## lm(formula = SalePrice ~ MSZoning + LotArea + Street + LandContour + 
##     LotConfig + LandSlope + Neighborhood + Condition1 + Condition2 + 
##     BldgType + HouseStyle + OverallQual + OverallCond + YearBuilt + 
##     YearRemodAdd + RoofStyle + RoofMatl + ExterQual + Foundation + 
##     BsmtFinSF1 + BsmtFinSF2 + BsmtUnfSF + X1stFlrSF + X2ndFlrSF + 
##     FullBath + BedroomAbvGr + KitchenAbvGr + KitchenQual + TotRmsAbvGrd + 
##     Functional + Fireplaces + GarageCars + GarageArea + WoodDeckSF + 
##     ScreenPorch + PoolArea + MoSold + SaleType, data = house.train.df)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -175053  -11348     296   10150  175053 
## 
## Coefficients:
##                       Estimate Std. Error t value Pr(>|t|)    
## (Intercept)         -1.590e+06  1.539e+05 -10.334  < 2e-16 ***
## MSZoningFV           3.081e+04  1.188e+04   2.593 0.009606 ** 
## MSZoningRH           2.235e+04  1.194e+04   1.871 0.061510 .  
## MSZoningRL           2.500e+04  1.010e+04   2.477 0.013380 *  
## MSZoningRM           2.399e+04  9.473e+03   2.532 0.011444 *  
## LotArea              7.290e-01  9.865e-02   7.390 2.58e-13 ***
## StreetPave           3.855e+04  1.186e+04   3.250 0.001183 ** 
## LandContourHLS       1.455e+04  5.097e+03   2.854 0.004383 ** 
## LandContourLow      -4.130e+03  6.216e+03  -0.664 0.506544    
## LandContourLvl       7.223e+03  3.620e+03   1.995 0.046236 *  
## LotConfigCulDSac     7.028e+03  3.147e+03   2.233 0.025700 *  
## LotConfigFR2        -5.531e+03  4.029e+03  -1.373 0.170034    
## LotConfigFR3        -1.330e+04  1.296e+04  -1.026 0.304974    
## LotConfigInside     -1.009e+03  1.745e+03  -0.578 0.563236    
## LandSlopeMod         1.085e+04  3.895e+03   2.785 0.005429 ** 
## LandSlopeSev        -3.134e+04  1.050e+04  -2.986 0.002882 ** 
## NeighborhoodBlueste  1.053e+03  1.905e+04   0.055 0.955933    
## NeighborhoodBrDale   7.068e+03  1.067e+04   0.662 0.507882    
## NeighborhoodBrkSide -4.220e+02  9.054e+03  -0.047 0.962830    
## NeighborhoodClearCr -1.098e+04  9.043e+03  -1.215 0.224730    
## NeighborhoodCollgCr -7.826e+03  7.177e+03  -1.090 0.275691    
## NeighborhoodCrawfor  8.985e+03  8.313e+03   1.081 0.279956    
## NeighborhoodEdwards -1.417e+04  7.825e+03  -1.811 0.070407 .  
## NeighborhoodGilbert -1.344e+04  7.566e+03  -1.777 0.075813 .  
## NeighborhoodIDOTRR  -4.029e+03  1.034e+04  -0.390 0.696942    
## NeighborhoodMeadowV  3.845e+02  1.021e+04   0.038 0.969963    
## NeighborhoodMitchel -1.931e+04  8.009e+03  -2.411 0.016039 *  
## NeighborhoodNAmes   -1.268e+04  7.615e+03  -1.665 0.096157 .  
## NeighborhoodNoRidge  2.977e+04  8.137e+03   3.659 0.000263 ***
## NeighborhoodNPkVill  4.911e+03  1.064e+04   0.461 0.644618    
## NeighborhoodNridgHt  2.459e+04  7.209e+03   3.411 0.000667 ***
## NeighborhoodNWAmes  -2.299e+04  7.812e+03  -2.943 0.003302 ** 
## NeighborhoodOldTown -1.200e+04  9.259e+03  -1.296 0.195336    
## NeighborhoodSawyer  -1.195e+04  7.987e+03  -1.496 0.134795    
## NeighborhoodSawyerW -8.005e+03  7.591e+03  -1.055 0.291808    
## NeighborhoodSomerst  1.200e+03  8.765e+03   0.137 0.891096    
## NeighborhoodStoneBr  3.612e+04  8.074e+03   4.473 8.35e-06 ***
## NeighborhoodSWISU   -5.338e+03  9.552e+03  -0.559 0.576342    
## NeighborhoodTimber  -6.451e+03  8.113e+03  -0.795 0.426680    
## NeighborhoodVeenker  2.206e+03  1.026e+04   0.215 0.829804    
## Condition1Feedr      3.626e+03  4.900e+03   0.740 0.459414    
## Condition1Norm       1.171e+04  4.064e+03   2.882 0.004018 ** 
## Condition1PosA       1.132e+04  9.977e+03   1.134 0.256844    
## Condition1PosN       1.143e+04  7.398e+03   1.545 0.122660    
## Condition1RRAe      -1.462e+04  8.815e+03  -1.658 0.097558 .  
## Condition1RRAn       8.111e+03  6.816e+03   1.190 0.234242    
## Condition1RRNe      -5.697e+03  1.799e+04  -0.317 0.751566    
## Condition1RRNn       8.997e+03  1.269e+04   0.709 0.478464    
## Condition2Feedr     -5.155e+03  2.241e+04  -0.230 0.818132    
## Condition2Norm      -2.705e+03  1.909e+04  -0.142 0.887315    
## Condition2PosA       3.240e+04  3.279e+04   0.988 0.323256    
## Condition2PosN      -2.319e+05  2.694e+04  -8.606  < 2e-16 ***
## Condition2RRAe      -1.272e+05  4.366e+04  -2.913 0.003635 ** 
## Condition2RRAn      -1.544e+03  3.115e+04  -0.050 0.960465    
## Condition2RRNn      -3.178e+03  2.634e+04  -0.121 0.903994    
## BldgType2fmCon      -4.461e+03  5.633e+03  -0.792 0.428582    
## BldgTypeDuplex      -6.219e+01  5.941e+03  -0.010 0.991649    
## BldgTypeTwnhs       -2.744e+04  5.353e+03  -5.127 3.38e-07 ***
## BldgTypeTwnhsE      -2.371e+04  3.640e+03  -6.516 1.02e-10 ***
## HouseStyle1.5Unf     1.274e+04  7.383e+03   1.725 0.084724 .  
## HouseStyle1Story     7.971e+03  3.540e+03   2.252 0.024500 *  
## HouseStyle2.5Fin    -5.760e+03  9.847e+03  -0.585 0.558693    
## HouseStyle2.5Unf    -1.377e+04  8.580e+03  -1.605 0.108830    
## HouseStyle2Story    -6.455e+03  3.131e+03  -2.062 0.039397 *  
## HouseStyleSFoyer     5.604e+03  5.455e+03   1.027 0.304461    
## HouseStyleSLvl       4.988e+03  4.397e+03   1.134 0.256869    
## OverallQual          7.793e+03  9.833e+02   7.926 4.74e-15 ***
## OverallCond          5.362e+03  7.873e+02   6.811 1.46e-11 ***
## YearBuilt            3.420e+02  6.301e+01   5.427 6.81e-08 ***
## YearRemodAdd         1.097e+02  5.214e+01   2.105 0.035490 *  
## RoofStyleGable      -8.072e+03  1.832e+04  -0.441 0.659567    
## RoofStyleGambrel    -8.076e+02  1.992e+04  -0.041 0.967663    
## RoofStyleHip        -5.084e+03  1.839e+04  -0.277 0.782190    
## RoofStyleMansard     1.088e+04  2.109e+04   0.516 0.605873    
## RoofStyleShed        7.967e+04  3.446e+04   2.312 0.020930 *  
## RoofMatlCompShg      6.545e+05  3.063e+04  21.369  < 2e-16 ***
## RoofMatlMembran      7.292e+05  4.533e+04  16.087  < 2e-16 ***
## RoofMatlMetal        6.996e+05  4.490e+04  15.581  < 2e-16 ***
## RoofMatlRoll         6.566e+05  3.927e+04  16.719  < 2e-16 ***
## RoofMatlTar&Grv      6.470e+05  3.541e+04  18.273  < 2e-16 ***
## RoofMatlWdShake      6.286e+05  3.367e+04  18.667  < 2e-16 ***
## RoofMatlWdShngl      7.311e+05  3.178e+04  23.002  < 2e-16 ***
## ExterQualFa         -1.446e+04  9.786e+03  -1.477 0.139788    
## ExterQualGd         -3.204e+04  4.660e+03  -6.874 9.53e-12 ***
## ExterQualTA         -3.386e+04  5.207e+03  -6.503 1.11e-10 ***
## FoundationCBlock     5.553e+02  3.047e+03   0.182 0.855400    
## FoundationPConc      5.388e+03  3.379e+03   1.595 0.111057    
## FoundationSlab       1.256e+04  7.108e+03   1.768 0.077354 .  
## FoundationStone     -2.508e+02  1.061e+04  -0.024 0.981139    
## FoundationWood      -2.822e+04  1.474e+04  -1.914 0.055801 .  
## BsmtFinSF1           3.795e+01  3.831e+00   9.905  < 2e-16 ***
## BsmtFinSF2           2.609e+01  5.401e+00   4.831 1.51e-06 ***
## BsmtUnfSF            1.573e+01  3.769e+00   4.175 3.18e-05 ***
## X1stFlrSF            5.531e+01  4.950e+00  11.173  < 2e-16 ***
## X2ndFlrSF            6.939e+01  4.782e+00  14.510  < 2e-16 ***
## FullBath             2.933e+03  1.982e+03   1.480 0.139171    
## BedroomAbvGr        -6.336e+03  1.329e+03  -4.766 2.09e-06 ***
## KitchenAbvGr        -1.850e+04  5.337e+03  -3.466 0.000544 ***
## KitchenQualFa       -2.137e+04  5.945e+03  -3.595 0.000336 ***
## KitchenQualGd       -2.836e+04  3.409e+03  -8.321  < 2e-16 ***
## KitchenQualTA       -2.611e+04  3.870e+03  -6.747 2.23e-11 ***
## TotRmsAbvGrd         1.555e+03  9.411e+02   1.652 0.098684 .  
## FunctionalMaj2      -9.426e+02  1.312e+04  -0.072 0.942738    
## FunctionalMin1       1.685e+03  8.345e+03   0.202 0.839986    
## FunctionalMin2       9.192e+03  8.210e+03   1.120 0.263068    
## FunctionalMod       -4.378e+03  9.734e+03  -0.450 0.652993    
## FunctionalSev       -7.531e+04  2.686e+04  -2.804 0.005115 ** 
## FunctionalTyp        1.799e+04  7.139e+03   2.520 0.011835 *  
## Fireplaces           2.944e+03  1.329e+03   2.215 0.026959 *  
## GarageCars           3.978e+03  2.152e+03   1.849 0.064748 .  
## GarageArea           1.328e+01  7.368e+00   1.803 0.071688 .  
## WoodDeckSF           9.906e+00  5.775e+00   1.715 0.086537 .  
## ScreenPorch          3.173e+01  1.212e+01   2.617 0.008962 ** 
## PoolArea             7.234e+01  1.745e+01   4.146 3.60e-05 ***
## MoSold              -5.716e+02  2.448e+02  -2.335 0.019694 *  
## SaleTypeCon          4.523e+04  1.811e+04   2.497 0.012633 *  
## SaleTypeConLD        1.747e+04  9.532e+03   1.832 0.067123 .  
## SaleTypeConLI        1.142e+04  1.175e+04   0.972 0.331224    
## SaleTypeConLw        6.004e+03  1.201e+04   0.500 0.617146    
## SaleTypeCWD          2.210e+04  1.295e+04   1.707 0.088090 .  
## SaleTypeNew          2.361e+04  4.836e+03   4.883 1.17e-06 ***
## SaleTypeOth          1.601e+04  1.475e+04   1.085 0.277919    
## SaleTypeWD           5.139e+03  3.970e+03   1.294 0.195736    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 24040 on 1337 degrees of freedom
## Multiple R-squared:  0.9161, Adjusted R-squared:  0.9085 
## F-statistic: 119.7 on 122 and 1337 DF,  p-value: < 2.2e-16

Subsetting the both train and test dataframe with selected independent variables.

library(randomForest)
## randomForest 4.6-14
## Type rfNews() to see new features/changes/bug fixes.
## 
## Attaching package: 'randomForest'
## The following object is masked from 'package:ggplot2':
## 
##     margin
## The following object is masked from 'package:dplyr':
## 
##     combine
set.seed(123)

house.train.df1 <- house.train.df %>% select('MSZoning', 'LotArea', 'Street', 'LandContour' , 'LotConfig' , 'LandSlope' ,  'Neighborhood' ,  'Condition1' ,  'Condition2' , 'BldgType' , 'HouseStyle' , 'OverallQual' ,'OverallCond' , 'YearBuilt' , 'YearRemodAdd' , 'RoofStyle' , 'RoofMatl', 'ExterQual' , 'Foundation', 'BsmtFinSF1' , 'BsmtFinSF2' , 'BsmtUnfSF' , 'X1stFlrSF' , 'X2ndFlrSF' , 'FullBath' , 'BedroomAbvGr' , 'KitchenAbvGr' , 'KitchenQual' , 'TotRmsAbvGrd' , 'Functional' , 'Fireplaces' , 'GarageCars' , 'GarageArea' , 'WoodDeckSF' ,  'ScreenPorch' , 'PoolArea' , 'MoSold' , 'SaleType', 'SalePrice'  )

ncol(house.train.df1)
## [1] 39
house.test.df1 <- house.test.df %>% select( 'MSZoning', 'LotArea', 'Street', 'LandContour' , 'LotConfig' , 'LandSlope' ,  'Neighborhood' ,  'Condition1' ,  'Condition2' , 'BldgType' , 'HouseStyle' , 'OverallQual' ,'OverallCond' , 'YearBuilt' , 'YearRemodAdd' , 'RoofStyle' , 'RoofMatl', 'ExterQual' , 'Foundation', 'BsmtFinSF1' , 'BsmtFinSF2' , 'BsmtUnfSF' , 'X1stFlrSF' , 'X2ndFlrSF' , 'FullBath' , 'BedroomAbvGr' , 'KitchenAbvGr' , 'KitchenQual' , 'TotRmsAbvGrd' , 'Functional' , 'Fireplaces' , 'GarageCars' , 'GarageArea' , 'WoodDeckSF' ,  'ScreenPorch' , 'PoolArea' , 'MoSold' , 'SaleType'  )

By looking at the test data, there are a lot of missing values for some of the quantitative and categorical variables. To aviod missing value problem with categorical variable, I’m dropping all categorical variables ad keeping only qualitative variables and use mean method to fill the missing qualitative variables in the test data.

summary(house.train.df1)
##     MSZoning       LotArea        Street     LandContour   LotConfig   
##  C (all):  10   Min.   :  1300   Grvl:   6   Bnk:  63    Corner : 263  
##  FV     :  65   1st Qu.:  7554   Pave:1454   HLS:  50    CulDSac:  94  
##  RH     :  16   Median :  9478               Low:  36    FR2    :  47  
##  RL     :1151   Mean   : 10517               Lvl:1311    FR3    :   4  
##  RM     : 218   3rd Qu.: 11602                           Inside :1052  
##                 Max.   :215245                                         
##                                                                        
##  LandSlope   Neighborhood   Condition1     Condition2     BldgType   
##  Gtl:1382   NAmes  :225   Norm   :1260   Norm   :1445   1Fam  :1220  
##  Mod:  65   CollgCr:150   Feedr  :  81   Feedr  :   6   2fmCon:  31  
##  Sev:  13   OldTown:113   Artery :  48   Artery :   2   Duplex:  52  
##             Edwards:100   RRAn   :  26   PosN   :   2   Twnhs :  43  
##             Somerst: 86   PosN   :  19   RRNn   :   2   TwnhsE: 114  
##             Gilbert: 79   RRAe   :  11   PosA   :   1                
##             (Other):707   (Other):  15   (Other):   2                
##    HouseStyle   OverallQual      OverallCond      YearBuilt   
##  1Story :726   Min.   : 1.000   Min.   :1.000   Min.   :1872  
##  2Story :445   1st Qu.: 5.000   1st Qu.:5.000   1st Qu.:1954  
##  1.5Fin :154   Median : 6.000   Median :5.000   Median :1973  
##  SLvl   : 65   Mean   : 6.099   Mean   :5.575   Mean   :1971  
##  SFoyer : 37   3rd Qu.: 7.000   3rd Qu.:6.000   3rd Qu.:2000  
##  1.5Unf : 14   Max.   :10.000   Max.   :9.000   Max.   :2010  
##  (Other): 19                                                  
##   YearRemodAdd    RoofStyle       RoofMatl    ExterQual  Foundation 
##  Min.   :1950   Flat   :  13   CompShg:1434   Ex: 52    BrkTil:146  
##  1st Qu.:1967   Gable  :1141   Tar&Grv:  11   Fa: 14    CBlock:634  
##  Median :1994   Gambrel:  11   WdShngl:   6   Gd:488    PConc :647  
##  Mean   :1985   Hip    : 286   WdShake:   5   TA:906    Slab  : 24  
##  3rd Qu.:2004   Mansard:   7   ClyTile:   1             Stone :  6  
##  Max.   :2010   Shed   :   2   Membran:   1             Wood  :  3  
##                                (Other):   2                         
##    BsmtFinSF1       BsmtFinSF2        BsmtUnfSF        X1stFlrSF   
##  Min.   :   0.0   Min.   :   0.00   Min.   :   0.0   Min.   : 334  
##  1st Qu.:   0.0   1st Qu.:   0.00   1st Qu.: 223.0   1st Qu.: 882  
##  Median : 383.5   Median :   0.00   Median : 477.5   Median :1087  
##  Mean   : 443.6   Mean   :  46.55   Mean   : 567.2   Mean   :1163  
##  3rd Qu.: 712.2   3rd Qu.:   0.00   3rd Qu.: 808.0   3rd Qu.:1391  
##  Max.   :5644.0   Max.   :1474.00   Max.   :2336.0   Max.   :4692  
##                                                                    
##    X2ndFlrSF       FullBath      BedroomAbvGr    KitchenAbvGr  
##  Min.   :   0   Min.   :0.000   Min.   :0.000   Min.   :0.000  
##  1st Qu.:   0   1st Qu.:1.000   1st Qu.:2.000   1st Qu.:1.000  
##  Median :   0   Median :2.000   Median :3.000   Median :1.000  
##  Mean   : 347   Mean   :1.565   Mean   :2.866   Mean   :1.047  
##  3rd Qu.: 728   3rd Qu.:2.000   3rd Qu.:3.000   3rd Qu.:1.000  
##  Max.   :2065   Max.   :3.000   Max.   :8.000   Max.   :3.000  
##                                                                
##  KitchenQual  TotRmsAbvGrd    Functional    Fireplaces      GarageCars   
##  Ex:100      Min.   : 2.000   Maj1:  14   Min.   :0.000   Min.   :0.000  
##  Fa: 39      1st Qu.: 5.000   Maj2:   5   1st Qu.:0.000   1st Qu.:1.000  
##  Gd:586      Median : 6.000   Min1:  31   Median :1.000   Median :2.000  
##  TA:735      Mean   : 6.518   Min2:  34   Mean   :0.613   Mean   :1.767  
##              3rd Qu.: 7.000   Mod :  15   3rd Qu.:1.000   3rd Qu.:2.000  
##              Max.   :14.000   Sev :   1   Max.   :3.000   Max.   :4.000  
##                               Typ :1360                                  
##    GarageArea       WoodDeckSF      ScreenPorch        PoolArea      
##  Min.   :   0.0   Min.   :  0.00   Min.   :  0.00   Min.   :  0.000  
##  1st Qu.: 334.5   1st Qu.:  0.00   1st Qu.:  0.00   1st Qu.:  0.000  
##  Median : 480.0   Median :  0.00   Median :  0.00   Median :  0.000  
##  Mean   : 473.0   Mean   : 94.24   Mean   : 15.06   Mean   :  2.759  
##  3rd Qu.: 576.0   3rd Qu.:168.00   3rd Qu.:  0.00   3rd Qu.:  0.000  
##  Max.   :1418.0   Max.   :857.00   Max.   :480.00   Max.   :738.000  
##                                                                      
##      MoSold          SaleType      SalePrice     
##  Min.   : 1.000   WD     :1267   Min.   : 34900  
##  1st Qu.: 5.000   New    : 122   1st Qu.:129975  
##  Median : 6.000   COD    :  43   Median :163000  
##  Mean   : 6.322   ConLD  :   9   Mean   :180921  
##  3rd Qu.: 8.000   ConLI  :   5   3rd Qu.:214000  
##  Max.   :12.000   ConLw  :   5   Max.   :755000  
##                   (Other):   9
summary(house.test.df1)
##     MSZoning       LotArea       Street     LandContour   LotConfig   
##  C (all):  15   Min.   : 1470   Grvl:   6   Bnk:  54    Corner : 248  
##  FV     :  74   1st Qu.: 7391   Pave:1453   HLS:  70    CulDSac:  82  
##  RH     :  10   Median : 9399               Low:  24    FR2    :  38  
##  RL     :1114   Mean   : 9819               Lvl:1311    FR3    :  10  
##  RM     : 242   3rd Qu.:11518                           Inside :1081  
##  NA's   :   4   Max.   :56600                                         
##                                                                       
##  LandSlope   Neighborhood   Condition1    Condition2     BldgType   
##  Gtl:1396   NAmes  :218   Norm   :1251   Artery:   3   1Fam  :1205  
##  Mod:  60   OldTown:126   Feedr  :  83   Feedr :   7   2fmCon:  31  
##  Sev:   3   CollgCr:117   Artery :  44   Norm  :1444   Duplex:  57  
##             Somerst: 96   RRAn   :  24   PosA  :   3   Twnhs :  53  
##             Edwards: 94   PosN   :  20   PosN  :   2   TwnhsE: 113  
##             NridgHt: 89   RRAe   :  17                              
##             (Other):719   (Other):  20                              
##   HouseStyle   OverallQual      OverallCond      YearBuilt   
##  1.5Fin:160   Min.   : 1.000   Min.   :1.000   Min.   :1879  
##  1.5Unf:  5   1st Qu.: 5.000   1st Qu.:5.000   1st Qu.:1953  
##  1Story:745   Median : 6.000   Median :5.000   Median :1973  
##  2.5Unf: 13   Mean   : 6.079   Mean   :5.554   Mean   :1971  
##  2Story:427   3rd Qu.: 7.000   3rd Qu.:6.000   3rd Qu.:2001  
##  SFoyer: 46   Max.   :10.000   Max.   :9.000   Max.   :2010  
##  SLvl  : 63                                                  
##   YearRemodAdd    RoofStyle       RoofMatl    ExterQual  Foundation 
##  Min.   :1950   Flat   :   7   CompShg:1442   Ex: 55    BrkTil:165  
##  1st Qu.:1963   Gable  :1169   Tar&Grv:  12   Fa: 21    CBlock:601  
##  Median :1992   Gambrel:  11   WdShake:   4   Gd:491    PConc :661  
##  Mean   :1984   Hip    : 265   WdShngl:   1   TA:892    Slab  : 25  
##  3rd Qu.:2004   Mansard:   4                            Stone :  5  
##  Max.   :2010   Shed   :   3                            Wood  :  2  
##                                                                     
##    BsmtFinSF1       BsmtFinSF2        BsmtUnfSF        X1stFlrSF     
##  Min.   :   0.0   Min.   :   0.00   Min.   :   0.0   Min.   : 407.0  
##  1st Qu.:   0.0   1st Qu.:   0.00   1st Qu.: 219.2   1st Qu.: 873.5  
##  Median : 350.5   Median :   0.00   Median : 460.0   Median :1079.0  
##  Mean   : 439.2   Mean   :  52.62   Mean   : 554.3   Mean   :1156.5  
##  3rd Qu.: 753.5   3rd Qu.:   0.00   3rd Qu.: 797.8   3rd Qu.:1382.5  
##  Max.   :4010.0   Max.   :1526.00   Max.   :2140.0   Max.   :5095.0  
##  NA's   :1        NA's   :1         NA's   :1                        
##    X2ndFlrSF       FullBath      BedroomAbvGr    KitchenAbvGr  
##  Min.   :   0   Min.   :0.000   Min.   :0.000   Min.   :0.000  
##  1st Qu.:   0   1st Qu.:1.000   1st Qu.:2.000   1st Qu.:1.000  
##  Median :   0   Median :2.000   Median :3.000   Median :1.000  
##  Mean   : 326   Mean   :1.571   Mean   :2.854   Mean   :1.042  
##  3rd Qu.: 676   3rd Qu.:2.000   3rd Qu.:3.000   3rd Qu.:1.000  
##  Max.   :1862   Max.   :4.000   Max.   :6.000   Max.   :2.000  
##                                                                
##  KitchenQual  TotRmsAbvGrd      Functional     Fireplaces    
##  Ex  :105    Min.   : 3.000   Typ    :1357   Min.   :0.0000  
##  Fa  : 31    1st Qu.: 5.000   Min2   :  36   1st Qu.:0.0000  
##  Gd  :565    Median : 6.000   Min1   :  34   Median :0.0000  
##  TA  :757    Mean   : 6.385   Mod    :  20   Mean   :0.5812  
##  NA's:  1    3rd Qu.: 7.000   Maj1   :   5   3rd Qu.:1.0000  
##              Max.   :15.000   (Other):   5   Max.   :4.0000  
##                               NA's   :   2                   
##    GarageCars      GarageArea       WoodDeckSF       ScreenPorch    
##  Min.   :0.000   Min.   :   0.0   Min.   :   0.00   Min.   :  0.00  
##  1st Qu.:1.000   1st Qu.: 318.0   1st Qu.:   0.00   1st Qu.:  0.00  
##  Median :2.000   Median : 480.0   Median :   0.00   Median :  0.00  
##  Mean   :1.766   Mean   : 472.8   Mean   :  93.17   Mean   : 17.06  
##  3rd Qu.:2.000   3rd Qu.: 576.0   3rd Qu.: 168.00   3rd Qu.:  0.00  
##  Max.   :5.000   Max.   :1488.0   Max.   :1424.00   Max.   :576.00  
##  NA's   :1       NA's   :1                                          
##     PoolArea           MoSold          SaleType   
##  Min.   :  0.000   Min.   : 1.000   WD     :1258  
##  1st Qu.:  0.000   1st Qu.: 4.000   New    : 117  
##  Median :  0.000   Median : 6.000   COD    :  44  
##  Mean   :  1.744   Mean   : 6.104   ConLD  :  17  
##  3rd Qu.:  0.000   3rd Qu.: 8.000   CWD    :   8  
##  Max.   :800.000   Max.   :12.000   (Other):  14  
##                                     NA's   :   1

Dropping all categorical fields from both train and test data. filling the missing values with the mean value.

house.train.df3 <- (house.train.df1[sapply(house.train.df1, is.numeric)])
house.test.df3 <- (house.test.df1[sapply(house.test.df1, is.numeric)])



house.test.df3$BsmtFinSF1 = ifelse(is.na(house.test.df3$BsmtFinSF1),
                     ave(house.train.df3$BsmtFinSF1, FUN = function(x) mean(x, na.rm = TRUE)),
                     house.test.df3$BsmtFinSF1)

house.test.df3$BsmtFinSF2 = ifelse(is.na(house.test.df3$BsmtFinSF2),
                     ave(house.train.df3$BsmtFinSF2, FUN = function(x) mean(x, na.rm = TRUE)),
                     house.test.df3$BsmtFinSF2)

house.test.df3$BsmtUnfSF = ifelse(is.na(house.test.df3$BsmtUnfSF),
                     ave(house.train.df3$BsmtUnfSF, FUN = function(x) mean(x, na.rm = TRUE)),
                     house.test.df3$BsmtUnfSF)


house.test.df3$GarageCars = ifelse(is.na(house.test.df3$GarageCars),
                     ave(house.train.df3$GarageCars, FUN = function(x) mean(x, na.rm = TRUE)),
                     house.test.df3$GarageCars)

house.test.df3$GarageArea = ifelse(is.na(house.test.df3$GarageArea),
                     ave(house.train.df3$GarageArea, FUN = function(x) mean(x, na.rm = TRUE)),
                     house.test.df3$GarageArea)


summary(house.train.df3)
##     LotArea        OverallQual      OverallCond      YearBuilt   
##  Min.   :  1300   Min.   : 1.000   Min.   :1.000   Min.   :1872  
##  1st Qu.:  7554   1st Qu.: 5.000   1st Qu.:5.000   1st Qu.:1954  
##  Median :  9478   Median : 6.000   Median :5.000   Median :1973  
##  Mean   : 10517   Mean   : 6.099   Mean   :5.575   Mean   :1971  
##  3rd Qu.: 11602   3rd Qu.: 7.000   3rd Qu.:6.000   3rd Qu.:2000  
##  Max.   :215245   Max.   :10.000   Max.   :9.000   Max.   :2010  
##   YearRemodAdd    BsmtFinSF1       BsmtFinSF2        BsmtUnfSF     
##  Min.   :1950   Min.   :   0.0   Min.   :   0.00   Min.   :   0.0  
##  1st Qu.:1967   1st Qu.:   0.0   1st Qu.:   0.00   1st Qu.: 223.0  
##  Median :1994   Median : 383.5   Median :   0.00   Median : 477.5  
##  Mean   :1985   Mean   : 443.6   Mean   :  46.55   Mean   : 567.2  
##  3rd Qu.:2004   3rd Qu.: 712.2   3rd Qu.:   0.00   3rd Qu.: 808.0  
##  Max.   :2010   Max.   :5644.0   Max.   :1474.00   Max.   :2336.0  
##    X1stFlrSF      X2ndFlrSF       FullBath      BedroomAbvGr  
##  Min.   : 334   Min.   :   0   Min.   :0.000   Min.   :0.000  
##  1st Qu.: 882   1st Qu.:   0   1st Qu.:1.000   1st Qu.:2.000  
##  Median :1087   Median :   0   Median :2.000   Median :3.000  
##  Mean   :1163   Mean   : 347   Mean   :1.565   Mean   :2.866  
##  3rd Qu.:1391   3rd Qu.: 728   3rd Qu.:2.000   3rd Qu.:3.000  
##  Max.   :4692   Max.   :2065   Max.   :3.000   Max.   :8.000  
##   KitchenAbvGr    TotRmsAbvGrd      Fireplaces      GarageCars   
##  Min.   :0.000   Min.   : 2.000   Min.   :0.000   Min.   :0.000  
##  1st Qu.:1.000   1st Qu.: 5.000   1st Qu.:0.000   1st Qu.:1.000  
##  Median :1.000   Median : 6.000   Median :1.000   Median :2.000  
##  Mean   :1.047   Mean   : 6.518   Mean   :0.613   Mean   :1.767  
##  3rd Qu.:1.000   3rd Qu.: 7.000   3rd Qu.:1.000   3rd Qu.:2.000  
##  Max.   :3.000   Max.   :14.000   Max.   :3.000   Max.   :4.000  
##    GarageArea       WoodDeckSF      ScreenPorch        PoolArea      
##  Min.   :   0.0   Min.   :  0.00   Min.   :  0.00   Min.   :  0.000  
##  1st Qu.: 334.5   1st Qu.:  0.00   1st Qu.:  0.00   1st Qu.:  0.000  
##  Median : 480.0   Median :  0.00   Median :  0.00   Median :  0.000  
##  Mean   : 473.0   Mean   : 94.24   Mean   : 15.06   Mean   :  2.759  
##  3rd Qu.: 576.0   3rd Qu.:168.00   3rd Qu.:  0.00   3rd Qu.:  0.000  
##  Max.   :1418.0   Max.   :857.00   Max.   :480.00   Max.   :738.000  
##      MoSold         SalePrice     
##  Min.   : 1.000   Min.   : 34900  
##  1st Qu.: 5.000   1st Qu.:129975  
##  Median : 6.000   Median :163000  
##  Mean   : 6.322   Mean   :180921  
##  3rd Qu.: 8.000   3rd Qu.:214000  
##  Max.   :12.000   Max.   :755000
ncol(house.train.df3)
## [1] 22
regressor = randomForest(x = house.train.df3[-22],
                         y = house.train.df3$SalePrice,
                         ntree = 500)

predicting for the new test data.

y_pred = predict(regressor, newdata = house.test.df3)
result <- data.frame('Id' = house.test.df$Id , 'SalePrice' = y_pred )
write.csv(result, file = "submission.csv", row.names=FALSE)
head(result)
##     Id SalePrice
## 1 1461  131624.6
## 2 1462  153469.1
## 3 1463  177977.2
## 4 1464  184078.5
## 5 1465  193968.0
## 6 1466  189100.3

Attaching the score details from kaggle. username: charlsjoseph score: 0.15170

Kaggle Score

Kaggle Score