The term ‘Vintage’ refers to the month or quarter in which account was opened (loan was granted). In simple words, the vintage analysis measures the performance of a portfolio in different periods of time after the loan (or credit card) was granted.

In simple words, it is the risk of borrower not repaying loan, credit card or any other type of loan.

#load libraries
library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(lubridate)
## 
## Attaching package: 'lubridate'
## The following objects are masked from 'package:base':
## 
##     date, intersect, setdiff, union
library(Rprofet)
## Warning: package 'Rprofet' was built under R version 4.2.3
library(dlookr)
## 
## Attaching package: 'dlookr'
## The following object is masked from 'package:base':
## 
##     transform
library(flextable)
#read the data

data = read.csv("E:/MScDataScience/predictive/projectgroup/April Vintage 2013.csv")


#checking the data
str(data)
## 'data.frame':    92630 obs. of  24 variables:
##  $ ID                     : int  24508841 24508841 24508841 24508841 24508841 24508841 24508841 24508841 24508841 24508841 ...
##  $ OpenDate               : chr  "4/2/2013" "4/2/2013" "4/2/2013" "4/2/2013" ...
##  $ DatePrevStmt           : chr  "NULL" "4/8/2013" "5/9/2013" "6/7/2013" ...
##  $ StatementDt            : chr  "4/8/2013" "5/9/2013" "6/7/2013" "7/9/2013" ...
##  $ MOB                    : int  0 1 2 3 4 5 6 7 8 9 ...
##  $ ExtStatus              : chr  " " " " " " " " ...
##  $ IntStatus              : chr  " " " " " " " " ...
##  $ DaysDeliq              : int  0 0 0 0 0 0 0 0 0 0 ...
##  $ ActualMinPay           : num  30 30 30 30 30 30 30 30 30 30 ...
##  $ OverlimitAmount        : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ DisplayMinPay          : num  30 30 30 30 30 30 30 30 30 30 ...
##  $ OpeningBalance         : num  0 180 154 160 268 ...
##  $ BillLateCharge         : num  0 0 0 0 0 0 0 25 0 0 ...
##  $ EndingBalance          : num  180 154 160 268 246 ...
##  $ CreditLimit            : int  300 300 300 300 300 300 300 300 300 300 ...
##  $ TotalNetPayments       : num  0 30 30 30 30 30 30 30 30 30 ...
##  $ TotalNetPurchaseAndCash: num  0 0 19.6 130 0 ...
##  $ TotalFeesBilled        : num  0 4.5 15.66 8.18 7.89 ...
##  $ Concessions            : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ QuarterlyCreditScore   : int  0 536 536 536 536 515 515 515 515 509 ...
##  $ Bscore                 : int  11 636 639 644 648 657 662 655 655 657 ...
##  $ City                   : chr  "NORTH LAS VEGAS             " "NORTH LAS VEGAS             " "NORTH LAS VEGAS             " "NORTH LAS VEGAS             " ...
##  $ State                  : chr  "NV" "NV" "NV" "NV" ...
##  $ ZipCode                : int  89031 89031 89031 89031 89031 89031 89031 89031 89031 89031 ...
summary(data)
##        ID             OpenDate         DatePrevStmt       StatementDt       
##  Min.   :24508841   Length:92630       Length:92630       Length:92630      
##  1st Qu.:24798025   Class :character   Class :character   Class :character  
##  Median :24817216   Mode  :character   Mode  :character   Mode  :character  
##  Mean   :24807089                                                           
##  3rd Qu.:24836995                                                           
##  Max.   :24856424                                                           
##       MOB          ExtStatus          IntStatus           DaysDeliq     
##  Min.   : 0.000   Length:92630       Length:92630       Min.   :  0.00  
##  1st Qu.: 3.000   Class :character   Class :character   1st Qu.:  0.00  
##  Median : 7.000   Mode  :character   Mode  :character   Median :  0.00  
##  Mean   : 7.273                                         Mean   : 25.54  
##  3rd Qu.:12.000                                         3rd Qu.: 30.00  
##  Max.   :17.000                                         Max.   :390.00  
##   ActualMinPay    OverlimitAmount   DisplayMinPay     OpeningBalance  
##  Min.   :   0.0   Min.   :   0.00   Min.   :-401.01   Min.   :-500.6  
##  1st Qu.:  30.0   1st Qu.:   0.00   1st Qu.:  30.00   1st Qu.: 175.0  
##  Median :  30.0   Median :   0.00   Median :  33.71   Median : 304.6  
##  Mean   :  63.2   Mean   :  28.39   Mean   :  84.99   Mean   : 333.3  
##  3rd Qu.:  60.0   3rd Qu.:  30.19   3rd Qu.:  90.00   3rd Qu.: 441.9  
##  Max.   :1237.0   Max.   :2199.63   Max.   :2374.63   Max.   :2499.6  
##  BillLateCharge   EndingBalance     CreditLimit    TotalNetPayments 
##  Min.   : 0.000   Min.   :-500.6   Min.   :  0.0   Min.   :-817.77  
##  1st Qu.: 0.000   1st Qu.: 203.1   1st Qu.:300.0   1st Qu.:   0.00  
##  Median : 0.000   Median : 310.6   Median :300.0   Median :  30.00  
##  Mean   : 8.553   Mean   : 351.4   Mean   :428.7   Mean   :  60.25  
##  3rd Qu.:25.000   3rd Qu.: 455.9   3rd Qu.:700.0   3rd Qu.:  68.97  
##  Max.   :35.000   Max.   :2499.6   Max.   :900.0   Max.   :2770.07  
##  TotalNetPurchaseAndCash TotalFeesBilled     Concessions       
##  Min.   :-2007.74        Min.   :-359.350   Min.   :-607.8700  
##  1st Qu.:    0.00        1st Qu.:   5.902   1st Qu.:   0.0000  
##  Median :    0.00        Median :  15.050   Median :   0.0000  
##  Mean   :   59.46        Mean   :  22.306   Mean   :  -0.7421  
##  3rd Qu.:   63.88        3rd Qu.:  38.550   3rd Qu.:   0.0000  
##  Max.   : 2488.63        Max.   : 190.520   Max.   : 414.3100  
##  QuarterlyCreditScore     Bscore          City              State          
##  Min.   :  0.0        Min.   : 11.0   Length:92630       Length:92630      
##  1st Qu.:513.0        1st Qu.:556.0   Class :character   Class :character  
##  Median :576.0        Median :624.0   Mode  :character   Mode  :character  
##  Mean   :521.2        Mean   :532.5                                        
##  3rd Qu.:626.0        3rd Qu.:651.0                                        
##  Max.   :798.0        Max.   :717.0                                        
##     ZipCode     
##  Min.   :  605  
##  1st Qu.:29102  
##  Median :46224  
##  Mean   :51290  
##  3rd Qu.:77703  
##  Max.   :99775
#checking the data
dim(data)
## [1] 92630    24
str(data)
## 'data.frame':    92630 obs. of  24 variables:
##  $ ID                     : int  24508841 24508841 24508841 24508841 24508841 24508841 24508841 24508841 24508841 24508841 ...
##  $ OpenDate               : chr  "4/2/2013" "4/2/2013" "4/2/2013" "4/2/2013" ...
##  $ DatePrevStmt           : chr  "NULL" "4/8/2013" "5/9/2013" "6/7/2013" ...
##  $ StatementDt            : chr  "4/8/2013" "5/9/2013" "6/7/2013" "7/9/2013" ...
##  $ MOB                    : int  0 1 2 3 4 5 6 7 8 9 ...
##  $ ExtStatus              : chr  " " " " " " " " ...
##  $ IntStatus              : chr  " " " " " " " " ...
##  $ DaysDeliq              : int  0 0 0 0 0 0 0 0 0 0 ...
##  $ ActualMinPay           : num  30 30 30 30 30 30 30 30 30 30 ...
##  $ OverlimitAmount        : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ DisplayMinPay          : num  30 30 30 30 30 30 30 30 30 30 ...
##  $ OpeningBalance         : num  0 180 154 160 268 ...
##  $ BillLateCharge         : num  0 0 0 0 0 0 0 25 0 0 ...
##  $ EndingBalance          : num  180 154 160 268 246 ...
##  $ CreditLimit            : int  300 300 300 300 300 300 300 300 300 300 ...
##  $ TotalNetPayments       : num  0 30 30 30 30 30 30 30 30 30 ...
##  $ TotalNetPurchaseAndCash: num  0 0 19.6 130 0 ...
##  $ TotalFeesBilled        : num  0 4.5 15.66 8.18 7.89 ...
##  $ Concessions            : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ QuarterlyCreditScore   : int  0 536 536 536 536 515 515 515 515 509 ...
##  $ Bscore                 : int  11 636 639 644 648 657 662 655 655 657 ...
##  $ City                   : chr  "NORTH LAS VEGAS             " "NORTH LAS VEGAS             " "NORTH LAS VEGAS             " "NORTH LAS VEGAS             " ...
##  $ State                  : chr  "NV" "NV" "NV" "NV" ...
##  $ ZipCode                : int  89031 89031 89031 89031 89031 89031 89031 89031 89031 89031 ...
summary(data)
##        ID             OpenDate         DatePrevStmt       StatementDt       
##  Min.   :24508841   Length:92630       Length:92630       Length:92630      
##  1st Qu.:24798025   Class :character   Class :character   Class :character  
##  Median :24817216   Mode  :character   Mode  :character   Mode  :character  
##  Mean   :24807089                                                           
##  3rd Qu.:24836995                                                           
##  Max.   :24856424                                                           
##       MOB          ExtStatus          IntStatus           DaysDeliq     
##  Min.   : 0.000   Length:92630       Length:92630       Min.   :  0.00  
##  1st Qu.: 3.000   Class :character   Class :character   1st Qu.:  0.00  
##  Median : 7.000   Mode  :character   Mode  :character   Median :  0.00  
##  Mean   : 7.273                                         Mean   : 25.54  
##  3rd Qu.:12.000                                         3rd Qu.: 30.00  
##  Max.   :17.000                                         Max.   :390.00  
##   ActualMinPay    OverlimitAmount   DisplayMinPay     OpeningBalance  
##  Min.   :   0.0   Min.   :   0.00   Min.   :-401.01   Min.   :-500.6  
##  1st Qu.:  30.0   1st Qu.:   0.00   1st Qu.:  30.00   1st Qu.: 175.0  
##  Median :  30.0   Median :   0.00   Median :  33.71   Median : 304.6  
##  Mean   :  63.2   Mean   :  28.39   Mean   :  84.99   Mean   : 333.3  
##  3rd Qu.:  60.0   3rd Qu.:  30.19   3rd Qu.:  90.00   3rd Qu.: 441.9  
##  Max.   :1237.0   Max.   :2199.63   Max.   :2374.63   Max.   :2499.6  
##  BillLateCharge   EndingBalance     CreditLimit    TotalNetPayments 
##  Min.   : 0.000   Min.   :-500.6   Min.   :  0.0   Min.   :-817.77  
##  1st Qu.: 0.000   1st Qu.: 203.1   1st Qu.:300.0   1st Qu.:   0.00  
##  Median : 0.000   Median : 310.6   Median :300.0   Median :  30.00  
##  Mean   : 8.553   Mean   : 351.4   Mean   :428.7   Mean   :  60.25  
##  3rd Qu.:25.000   3rd Qu.: 455.9   3rd Qu.:700.0   3rd Qu.:  68.97  
##  Max.   :35.000   Max.   :2499.6   Max.   :900.0   Max.   :2770.07  
##  TotalNetPurchaseAndCash TotalFeesBilled     Concessions       
##  Min.   :-2007.74        Min.   :-359.350   Min.   :-607.8700  
##  1st Qu.:    0.00        1st Qu.:   5.902   1st Qu.:   0.0000  
##  Median :    0.00        Median :  15.050   Median :   0.0000  
##  Mean   :   59.46        Mean   :  22.306   Mean   :  -0.7421  
##  3rd Qu.:   63.88        3rd Qu.:  38.550   3rd Qu.:   0.0000  
##  Max.   : 2488.63        Max.   : 190.520   Max.   : 414.3100  
##  QuarterlyCreditScore     Bscore          City              State          
##  Min.   :  0.0        Min.   : 11.0   Length:92630       Length:92630      
##  1st Qu.:513.0        1st Qu.:556.0   Class :character   Class :character  
##  Median :576.0        Median :624.0   Mode  :character   Mode  :character  
##  Mean   :521.2        Mean   :532.5                                        
##  3rd Qu.:626.0        3rd Qu.:651.0                                        
##  Max.   :798.0        Max.   :717.0                                        
##     ZipCode     
##  Min.   :  605  
##  1st Qu.:29102  
##  Median :46224  
##  Mean   :51290  
##  3rd Qu.:77703  
##  Max.   :99775
#Creating a variable called Bad
data$Bad = ifelse(data$DaysDeliq>=60 | (data$ExtStatus != "C" & data$ExtStatus != ' '),1,0)
sum(data$Bad)
## [1] 18183
table(data$Bad)
## 
##     0     1 
## 74447 18183
#Getting the data which has month on books = 3
library(lubridate)
data$StatementDt = as.Date(data$StatementDt)

MOB3Data = data[data$MOB == 3,]
MOB3Data = MOB3Data %>%
  group_by(ID) %>%
  slice(which.max(StatementDt)) 

dim(MOB3Data)
## [1] 2945   25
#Getting data with each account's highest statement date

newData = data %>%
  group_by(ID) %>%
  slice(which.max(as.Date(StatementDt)) )


#Checking to make sure that there are no duplicate account number
sum(duplicated(newData$ID))
## [1] 0
#Getting last observed bad value to replace bad value for when the months on books =s 3

newData_subset <- newData[newData$ID %in% MOB3Data$ID, ]
MOB3Data$Bad[match(MOB3Data$ID, newData_subset$ID)] <- newData_subset$Bad

BadRate = round(sum(MOB3Data$Bad)/length(MOB3Data$ID)*100,2)
paste("The bad rate is: ", BadRate, "%.")
## [1] "The bad rate is:  42.89 %."
#Calculating Write-off dollars
MOB3Data$WriteOffDollars = ifelse(MOB3Data$Bad == 1, MOB3Data$EndingBalance, 0)
sum(MOB3Data$WriteOffDollars)
## [1] 547776.4
summary(MOB3Data$WriteOffDollars)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##     0.0     0.0     0.0   186.0   375.2   916.8
#summary of the data
summary(MOB3Data)
##        ID             OpenDate         DatePrevStmt        StatementDt        
##  Min.   :24508841   Length:2945        Length:2945        Min.   :0007-03-20  
##  1st Qu.:24777030   Class :character   Class :character   1st Qu.:0007-09-20  
##  Median :24803066   Mode  :character   Mode  :character   Median :0007-09-20  
##  Mean   :24786722                                         Mean   :0007-10-02  
##  3rd Qu.:24814332                                         3rd Qu.:0007-10-20  
##  Max.   :24855267                                         Max.   :0007-12-20  
##       MOB     ExtStatus          IntStatus           DaysDeliq    
##  Min.   :3   Length:2945        Length:2945        Min.   : 0.00  
##  1st Qu.:3   Class :character   Class :character   1st Qu.: 0.00  
##  Median :3   Mode  :character   Mode  :character   Median : 0.00  
##  Mean   :3                                         Mean   :22.89  
##  3rd Qu.:3                                         3rd Qu.:31.00  
##  Max.   :3                                         Max.   :91.00  
##   ActualMinPay    OverlimitAmount DisplayMinPay    OpeningBalance  
##  Min.   :  0.00   Min.   :  0.0   Min.   :  0.00   Min.   :-237.0  
##  1st Qu.: 30.00   1st Qu.:  0.0   1st Qu.: 30.00   1st Qu.: 241.7  
##  Median : 42.00   Median :  0.0   Median : 44.00   Median : 310.0  
##  Mean   : 57.94   Mean   : 32.0   Mean   : 89.82   Mean   : 347.5  
##  3rd Qu.: 90.00   3rd Qu.: 47.7   3rd Qu.:127.83   3rd Qu.: 391.4  
##  Max.   :219.00   Max.   :427.2   Max.   :586.96   Max.   : 845.9  
##  BillLateCharge  EndingBalance     CreditLimit    TotalNetPayments 
##  Min.   : 0.00   Min.   :-397.8   Min.   :  0.0   Min.   :-550.20  
##  1st Qu.: 0.00   1st Qu.: 261.8   1st Qu.:300.0   1st Qu.:   0.00  
##  Median : 0.00   Median : 333.1   Median :300.0   Median :  30.00  
##  Mean   :14.09   Mean   : 373.1   Mean   :409.3   Mean   :  60.49  
##  3rd Qu.:35.00   3rd Qu.: 433.6   3rd Qu.:700.0   3rd Qu.:  70.00  
##  Max.   :35.00   Max.   : 916.8   Max.   :700.0   Max.   :1225.00  
##  TotalNetPurchaseAndCash TotalFeesBilled    Concessions       
##  Min.   :-155.40         Min.   :-252.17   Min.   :-100.0000  
##  1st Qu.:   0.00         1st Qu.:   8.58   1st Qu.:   0.0000  
##  Median :  11.67         Median :  24.36   Median :   0.0000  
##  Mean   :  60.76         Mean   :  24.90   Mean   :  -0.5866  
##  3rd Qu.:  77.98         3rd Qu.:  45.02   3rd Qu.:   0.0000  
##  Max.   :1051.52         Max.   :  83.41   Max.   :  45.0000  
##  QuarterlyCreditScore     Bscore          City              State          
##  Min.   :  0.0        Min.   :234.0   Length:2945        Length:2945       
##  1st Qu.:529.0        1st Qu.:576.0   Class :character   Class :character  
##  Median :582.0        Median :621.0   Mode  :character   Mode  :character  
##  Mean   :552.3        Mean   :570.6                                        
##  3rd Qu.:625.0        3rd Qu.:648.0                                        
##  Max.   :791.0        Max.   :695.0                                        
##     ZipCode           Bad         WriteOffDollars
##  Min.   :  693   Min.   :0.0000   Min.   :  0.0  
##  1st Qu.:28043   1st Qu.:0.0000   1st Qu.:  0.0  
##  Median :43758   Median :0.0000   Median :  0.0  
##  Mean   :49204   Mean   :0.4289   Mean   :186.0  
##  3rd Qu.:76543   3rd Qu.:1.0000   3rd Qu.:375.2  
##  Max.   :99705   Max.   :1.0000   Max.   :916.8
#Exploratory data analysis

#obtaining histogram of numeric variables from the input data
par(mfrow = c(3,2))

hist(MOB3Data$DaysDeliq, main = 'Histogram of DaysDeliq variable', xlab = "Days Delinquent", col = "red")
hist(MOB3Data$ActualMinPay, main = 'Histogram of ActualMinPay variable', xlab = "Days ActualMinPay", col = "blue")
hist(MOB3Data$OverlimitAmount, main = 'Histogram of OverlimitAmount variable', xlab =  "Overlimit Amount", col = "green")
hist(MOB3Data$DisplayMinPay, main = 'Histogram of DisplayMinPay variable', xlab = "Display Minimum Pay", col ='yellow')
hist(MOB3Data$OpeningBalance, main = 'Histogram of OpeningBalance variable', xlab = "Opening  Balance", col = 'purple')
hist(MOB3Data$BillLateCharge, main = 'Histogram of BillLateCharge variable', xlab = "BillLateCharge", col = 'darkgreen')

hist(MOB3Data$EndingBalance, main = 'Histogram of EndingBalance variable', xlab = "Ending Balance", col = 'maroon')
hist(MOB3Data$CreditLimit, main = 'Histogram of CreditLimit variable', xlab = "Credit Limit", col = 'green')
hist(MOB3Data$TotalNetPayments, main = 'Histogram of TotalNet \n Payments variable', xlab = "Total  Net Payments", col = 'violet')

hist(MOB3Data$TotalNetPurchaseAndCash, main = "Histogram of TotalNetPurchase \n AndCash variable", xlab = "Total Net Purchases and Cash", col = 'darkblue')
hist(MOB3Data$TotalFeesBilled, main = 'Histogram of TotalFees \n Billed variable', xlab = "Total Fees Billed", col = 'darkred')
hist(MOB3Data$Concessions, main = 'Histogram of Concessions variable', xlab = "Concessions", col = 'yellow')

hist(MOB3Data$QuarterlyCreditScore, main = 'Histogram of QuarterlyCredit \n Score variable', xlab = "Quarterly Credit Score", col = 'orange')
hist(MOB3Data$Bscore, main = 'Histogram of \n Bscore variable', xlab = "Behavior Score", col = 'green')

hist(MOB3Data$WriteOffDollars, col = "blue", main = "Histogram of \n Write Off Dollars")
hist(MOB3Data$Bad, col = 'pink', main = 'Histogram of Bad')


#sUMMARY tables for external status and internal status
table(MOB3Data$ExtStatus)
## 
##         C    E    F    I    Z 
## 2533   70   20  320    1    1
table(MOB3Data$IntStatus)
## 
##         D    N    O    X 
## 1450  104   11  321 1059

#Calculating lifetime purchase activities

LifetimePurchasesTotal = aggregate(TotalNetPurchaseAndCash ~ ID, data, sum)
colnames(LifetimePurchasesTotal) = c("ID", "LifeTimePurchases")

LifetimePurchasesMin = aggregate(TotalNetPurchaseAndCash ~ ID, data, min)
colnames(LifetimePurchasesMin) = c("ID", "MinLifeTimePurchases")
LifetimePurchasesMin = LifetimePurchasesMin[,-1]

LifetimePurchasesMax = aggregate(TotalNetPurchaseAndCash ~ ID, data, max)
colnames(LifetimePurchasesMax) = c("ID", "MaxLifeTimePurchases")
LifetimePurchasesMax =LifetimePurchasesMax[,-1]

LifetimePurchasesMean = aggregate(TotalNetPurchaseAndCash ~ ID, data, mean)
colnames(LifetimePurchasesMean) = c("ID", "AvgLifeTimePurchases")
LifetimePurchasesMean = LifetimePurchasesMean[,-1]

#Calculating and lifetime purchase activities

LifetimePaymentsTotal = aggregate(TotalNetPayments ~ ID, data, sum)
colnames(LifetimePaymentsTotal) = c("ID", "LifeTimePayments")
LifetimePaymentsTotal = LifetimePaymentsTotal[,-1]

LifetimePaymentsMin = aggregate(TotalNetPayments ~ ID, data, min)
colnames(LifetimePaymentsMin) = c("ID", "MinLifeTimePayments")
LifetimePaymentsMin = LifetimePaymentsMin[,-1]

LifetimePaymentsMax = aggregate(TotalNetPayments ~ ID, data, max)
colnames(LifetimePaymentsMax) = c("ID", "MaxLifeTimePayments")
LifetimePaymentsMax = LifetimePaymentsMax[,-1]

LifetimePaymentsMean = aggregate(TotalNetPayments ~ ID, data, mean)
colnames(LifetimePaymentsMean) = c("ID", "AvgLifeTimePayments")
LifetimePaymentsMean =LifetimePaymentsMean[,-1]

LifetimeActivity = data.frame(LifetimePurchasesTotal, LifetimePurchasesMin, LifetimePurchasesMax, LifetimePurchasesMean, LifetimePaymentsTotal, LifetimePaymentsMin, LifetimePaymentsMax, LifetimePaymentsMean)

dim(LifetimeActivity)
## [1] 7038    9
head(LifetimeActivity)
# summarizing the new lifetime activity
summary(LifetimeActivity)
##        ID           LifeTimePurchases LifetimePurchasesMin LifetimePurchasesMax
##  Min.   :24508841   Min.   :  -57.5   Min.   :-2007.740    Min.   :   0.0      
##  1st Qu.:24794684   1st Qu.:  232.9   1st Qu.:    0.000    1st Qu.: 155.4      
##  Median :24815692   Median :  588.6   Median :    0.000    Median : 253.5      
##  Mean   :24804400   Mean   :  782.6   Mean   :   -2.361    Mean   : 283.3      
##  3rd Qu.:24835123   3rd Qu.: 1021.0   3rd Qu.:    0.000    3rd Qu.: 397.7      
##  Max.   :24856424   Max.   :17551.9   Max.   :    0.000    Max.   :2488.6      
##  LifetimePurchasesMean LifetimePaymentsTotal LifetimePaymentsMin
##  Min.   :-11.50        Min.   : -190.0       Min.   :-817.770   
##  1st Qu.: 23.97        1st Qu.:   80.0       1st Qu.:   0.000   
##  Median : 42.71        Median :  614.1       Median :   0.000   
##  Mean   : 52.54        Mean   :  792.9       Mean   :  -4.709   
##  3rd Qu.: 69.47        3rd Qu.: 1132.6       3rd Qu.:   0.000   
##  Max.   :975.11        Max.   :18134.7       Max.   :   0.000   
##  LifetimePaymentsMax LifetimePaymentsMean
##  Min.   :   0        Min.   : -19.000    
##  1st Qu.:  50        1st Qu.:   9.367    
##  Median : 140        Median :  38.409    
##  Mean   : 196        Mean   :  48.157    
##  3rd Qu.: 300        3rd Qu.:  68.439    
##  Max.   :2770        Max.   :1007.485
#Exploratory data analysis of Lifetime purchases and lifetime payments
par(mfrow = c(1,3))

hist(LifetimeActivity$LifetimePurchasesMin, col = "lightgreen", main = "Histogram of Minimum \n Lifetime Purchases", breaks = 10) 

hist(LifetimeActivity$LifetimePurchasesMax, col = 'darkgreen', main = "Histogram of Maximum \n Lifetime Purchases", breaks = 10) 

hist(LifetimeActivity$LifetimePurchasesMean, col = 'green', main = "Histogram of Average \n Lifetime Purchases", breaks = 10) 

hist(LifetimeActivity$LifeTimePurchases, col = 'blue', main = "Histogram of Total \n Lifetime Purchases", breaks = 10)


hist(LifetimeActivity$LifetimePaymentsMin, col = "maroon", main = "Histogram of Minimum \n Lifetime Payments", breaks = 10) 

hist(LifetimeActivity$LifetimePaymentsMax, col = 'red', main = "Histogram of Maximum \n Lifetime Payments", breaks = 10) 

hist(LifetimeActivity$LifetimePaymentsMean, col = 'pink', main = "Histogram of Average \n Lifetime Payments", breaks = 10) 

hist(LifetimeActivity$LifetimePaymentsTotal, col = 'orange', main = "Histogram of Total \n Lifetime Payments", breaks = 10, )

# Creating possible gain loss variable

LifetimeActivity$PossibleGainLoss = LifetimeActivity$LifetimePurchasesMean - LifetimeActivity$LifetimePaymentsMean
sum(LifetimeActivity$PossibleGainLoss)
## [1] 30855.53
summary(LifetimeActivity$PossibleGainLoss)
##     Min.  1st Qu.   Median     Mean  3rd Qu.     Max. 
## -100.000   -9.101    0.000    4.384   10.336  206.435
#Combining lifetime activity to the final dataset for modelling

newData_subset = LifetimeActivity[LifetimeActivity$ID %in% MOB3Data$ID, ]
MOB3Data = data.frame(MOB3Data, newData_subset[,-1])

#Binning and plotting the data

#Creating buckets

MOB3Data$del_bin = cut(MOB3Data$DaysDeliq, breaks = c(0, 30, 60, Inf), right = F)
MOB3Data$act_min_pay_bin = cut(MOB3Data$ActualMinPay, breaks = c(0, 50, 100, 150, 200,Inf),  right = F)
MOB3Data$overlimit_bin = cut(MOB3Data$OverlimitAmount, breaks = c(-Inf,0,100, 200,300, Inf),  right = F)
MOB3Data$open_blan_bin = cut(MOB3Data$OpeningBalance, breaks = c(-Inf, 0, 200, 400, 600, Inf),  right = F)
MOB3Data$bill_charge_bin = cut(MOB3Data$BillLateCharge, breaks = c(-Inf, 0, 10, 20, 30, Inf),  right = F)
MOB3Data$end_bal_bin = cut(MOB3Data$EndingBalance, breaks = c(-Inf, 0, 200, 400, 600, 800, Inf),right = F)
MOB3Data$credLmt_bin = cut(MOB3Data$CreditLimit, breaks = c(-Inf,250,500, Inf),  right = F)
MOB3Data$TNP_bin = cut(MOB3Data$TotalNetPayments, breaks = c(-Inf, -250, 0, 250, 500, 750,1000,Inf), right = F)
MOB3Data$TNPC_bin = cut(MOB3Data$TotalNetPurchaseAndCash, breaks = c(-Inf, 0, 200, 400,600, 800,Inf), right = F)
MOB3Data$feebilled_bin = cut(MOB3Data$TotalFeesBilled, breaks = c(-Inf, 0, 25, 50,Inf), right = F)  
MOB3Data$conces_bin = cut(MOB3Data$Concessions, breaks = c(-Inf,0,10, 20,30, Inf),  right = F)
MOB3Data$cred_Score_bin = cut(MOB3Data$QuarterlyCreditScore, breaks = c(-Inf,0,200,400, 600, Inf),  right = F)
MOB3Data$LifetimePay_bin = cut(MOB3Data$LifetimePaymentsTotal, breaks = c(-Inf, 0, 250, 500, 750, 1000, Inf ), right = F)
MOB3Data$LifetimePur_bin = cut(MOB3Data$LifeTimePurchases, breaks = c(-Inf, 0, 3000, 6000,12000,Inf ), right = F)
MOB3Data$ChargeOffDollars_bin = cut(MOB3Data$WriteOffDollars, breaks = c(-Inf, 200, 400, 600, Inf), right = F)
MOB3Data$GainLossBin = cut(MOB3Data$PossibleGainLoss, breaks = c(-Inf, 0, 50,100,150, Inf), right = F)
MOB3Data$AvgLifetimePurchasesBin =cut(MOB3Data$LifetimePurchasesMean, breaks = c(-Inf, 0, 200, 400,600,800,Inf), right = F)
MOB3Data$MaxLifetimePurchasesBin = cut(MOB3Data$LifetimePurchasesMax, breaks = c(-Inf, 0, 1000, 2000, Inf), right = F )
MOB3Data$MinLifetimePurchasesBin = cut(MOB3Data$LifetimePurchasesMin, breaks = c(-Inf, -2000, -1000, 0, 1000, 2000, Inf), right = F )
MOB3Data$MinLifetimePaymentsBin = cut(MOB3Data$LifetimePaymentsMin, breaks = c(-Inf, -471, -271, -71, Inf), right = F )
MOB3Data$MaxLifetimePaymentsBin = cut(MOB3Data$LifetimePaymentsMax, breaks = c(-Inf, 0, 500, 1000, 1500, Inf), right = F )
MOB3Data$AvgLifetimePaymentsBin = cut(MOB3Data$LifetimePaymentsMean, breaks = c(-Inf, 0, 200, 400, 600, 800, Inf), right = F )
#Plotting the binned data
par(mfrow = c(1,3))

delinquent = aggregate(Bad~del_bin, data = MOB3Data, FUN = mean)
barplot(Bad ~ del_bin, data = delinquent, col = 'pink' , xlab = " Days Delinquent ", main = "Days Delinquent vs Bad")

billed = aggregate(Bad~feebilled_bin, data = MOB3Data, FUN = mean )
barplot(Bad~feebilled_bin, data = billed, col = "blue", xlab = " Fees Billed Amount", main = "Fees Billed Amount vs Bad")


LtChg = aggregate(Bad~bill_charge_bin, data = MOB3Data, FUN = mean )
barplot(Bad~bill_charge_bin, data = LtChg, col = "royalblue", xlab = " Late Charge Amount", main = "Late Charge Amount vs Bad")

####################################################

credscr = aggregate(Bad~cred_Score_bin, data = MOB3Data, FUN = mean)
barplot(Bad~cred_Score_bin, data = credscr, col = 'maroon', xlab = " Credit Score", main = "Quarterly Credit Score vs Bad")

NetPmts =  aggregate(Bad~TNP_bin, data = MOB3Data, FUN = mean )
barplot(Bad~TNP_bin, data = NetPmts, col = "green", xlab = " Total Net Payments Amount", main = "Total Net Payments vs Bad")

AvgLftPrchs  = aggregate(Bad~AvgLifetimePurchasesBin, data = MOB3Data, FUN = mean)
barplot(Bad~AvgLifetimePurchasesBin, data = AvgLftPrchs, col = "green", xlab = " Avg Lifetime Purchase Amount", main = "Avg Lifetime Purchase Amount vs Bad")

Purchs = aggregate(Bad~TNPC_bin, data = MOB3Data, FUN = mean )
barplot(Bad~TNPC_bin, data = Purchs, col = "pink", xlab = " Total Net Purchases and Cash", main = "Total Net Purchases and Cash vs Bad")

lftPur = aggregate(Bad~LifetimePur_bin, data = MOB3Data, FUN = mean)
barplot(Bad~LifetimePur_bin, data = lftPur, col = 'orange', xlab = " Lifetime Purchases Amount", main = " Lifetime Purchases Amount vs Bad")

AvgLftPmts  = aggregate(Bad~AvgLifetimePaymentsBin, data = MOB3Data, FUN = mean)
barplot(Bad~AvgLifetimePaymentsBin, data = AvgLftPmts, col = "pink", xlab = " Avg Lifetime Payments Amount", main = "Avg Lifetime Payment Amount vs Bad")

minPay = aggregate(Bad~act_min_pay_bin, data = MOB3Data, FUN = mean )
barplot(Bad~act_min_pay_bin, data = minPay, col = "maroon", xlab = " ActualMinPay",main = "Actual Min. Pay vs Bad")

overLMT = aggregate(Bad~overlimit_bin, data = MOB3Data, FUN = mean )
barplot(Bad~overlimit_bin, data = overLMT, col = "green", xlab = " Overlimit Amount", main = "Overlimit Amount vs Bad")

ChgOff = aggregate(Bad~ChargeOffDollars_bin, data = MOB3Data, FUN = mean)
barplot(Bad~ChargeOffDollars_bin, data = ChgOff, col = 'pink', xlab = " Chargeoff Amount", main = " Chargeoff  Amount vs Bad")

opnBal = aggregate(Bad~open_blan_bin, data = MOB3Data, FUN = mean )
barplot(Bad~open_blan_bin, data = opnBal, col = "orange", xlab = " Opening Balance Amount", main = "Opening Balance  vs Bad")

EndBal =  aggregate(Bad~end_bal_bin, data = MOB3Data, FUN = mean )
barplot(Bad~end_bal_bin, data = EndBal, col = "green", xlab = " Ending Balance Amount", main = "Ending Balance Amount vs Bad")

CredLim =  aggregate(Bad~credLmt_bin, data = MOB3Data, FUN = mean )
barplot(Bad~credLmt_bin, data = CredLim, col = "yellow", xlab = " Credit Limit Amount", main = "Credit Limit Amount vs Bad")

concess = aggregate(Bad~conces_bin, data = MOB3Data, FUN = mean )
barplot(Bad~conces_bin, data = concess, col = "red", xlab = " Concession Amount", main = "Concession Amount vs Bad")

GainLoss = aggregate(Bad~GainLossBin, data = MOB3Data, FUN = mean)
barplot(Bad~GainLossBin, data = GainLoss, col = "orange", xlab = " Possible Gain/Loss Amount", main = "Possible Gain/Loss Amount vs Bad")

MaxLftPrchs  = aggregate(Bad~MaxLifetimePurchasesBin, data = MOB3Data, FUN = mean)
barplot(Bad~MaxLifetimePurchasesBin, data = MaxLftPrchs, col = "red", xlab = " Max Lifetime Purchase Amount", main = "Max Lifetime Purchase Amount vs Bad")

MinLftPrchs  = aggregate(Bad~MinLifetimePurchasesBin, data = MOB3Data, FUN = mean)
barplot(Bad~MinLifetimePurchasesBin, data = MinLftPrchs, col = "blue", xlab = " Min Lifetime Purchase Amount", main = "Min Lifetime Purchase Amount vs Bad")

MinLftPmts  = aggregate(Bad~MinLifetimePaymentsBin, data = MOB3Data, FUN = mean)
barplot(Bad~MinLifetimePaymentsBin, data = MinLftPmts, col = "blue", xlab = " Min Lifetime Payments Amount", main = "Min Lifetime Payment Amount vs Bad")

MaxLftPmts  = aggregate(Bad~MaxLifetimePaymentsBin, data = MOB3Data, FUN = mean)
barplot(Bad~MaxLifetimePaymentsBin, data = MaxLftPmts, col = "red", xlab = " Max Lifetime Payments Amount", main = "Max Lifetime Payment Amount vs Bad")

#summarizing the binned data

summary(MOB3Data$del_bin) #days delinquent bin
##   [0,30)  [30,60) [60,Inf) 
##     1782      475      688
summary(MOB3Data$act_min_pay_bin) #actual minimum payment bin
##    [0,50)  [50,100) [100,150) [150,200) [200,Inf) 
##      1711       753       367        76        38
summary(MOB3Data$overlimit_bin) #overlimit amount bin
##   [-Inf,0)    [0,100)  [100,200)  [200,300) [300, Inf) 
##          0       2551        379         13          2
summary(MOB3Data$open_blan_bin) #opening balance bin
##   [-Inf,0)    [0,200)  [200,400)  [400,600) [600, Inf) 
##         13        546       1676        199        511
summary(MOB3Data$bill_charge_bin) #late charge bin
##  [-Inf,0)    [0,10)   [10,20)   [20,30) [30, Inf) 
##         0      1647         3       291      1004
summary(MOB3Data$end_bal_bin)#ending balance bin
##   [-Inf,0)    [0,200)  [200,400)  [400,600)  [600,800) [800, Inf) 
##         11        422       1527        443        439        103
summary(MOB3Data$credLmt_bin) #Credit limit bin 
## [-Inf,250)  [250,500) [500, Inf) 
##         14       2149        782
summary(MOB3Data$TNP_bin) # total net payments bin
##  [-Inf,-250)     [-250,0)      [0,250)    [250,500)    [500,750)  [750,1e+03) 
##            2            7         2755          151           26            2 
## [1e+03, Inf) 
##            2
summary(MOB3Data$TNPC_bin) # total net purchases and cash bin
##   [-Inf,0)    [0,200)  [200,400)  [400,600)  [600,800) [800, Inf) 
##          7       2650        240         37          9          2
summary(MOB3Data$feebilled_bin) #total fees billed bin 
##  [-Inf,0)    [0,25)   [25,50) [50, Inf) 
##        46      1434      1203       262
summary(MOB3Data$conces_bin) #concessions bill
##  [-Inf,0)    [0,10)   [10,20)   [20,30) [30, Inf) 
##        65      2876         0         1         3
summary(MOB3Data$cred_Score_bin) #quarterly credit score bin
##   [-Inf,0)    [0,200)  [200,400)  [400,600) [600, Inf) 
##          0        153          0       1623       1169
summary(MOB3Data$LifetimePay_bin)#lifetime payments bin
##     [-Inf,0)      [0,250)    [250,500)    [500,750)  [750,1e+03) [1e+03, Inf) 
##            1          999          290          367          392          896
summary(MOB3Data$LifetimePur_bin)# Lifetime purchases and cash bin
##        [-Inf,0)       [0,3e+03)   [3e+03,6e+03) [6e+03,1.2e+04)  [1.2e+04, Inf) 
##               4            2883              54               3               1
summary(MOB3Data$ChargeOffDollars_bin) # writeoff dollars bin 
## [-Inf,200)  [200,400)  [400,600) [600, Inf) 
##       1729        663        311        242
summary(MOB3Data$GainLossBin) #possible gain/loss bin 
##   [-Inf,0)     [0,50)   [50,100)  [100,150) [150, Inf) 
##       1516       1276        106         47          0
summary(MOB3Data$MaxLifetimePurchasesBin) #Maximum lifetime purchases bin
##      [-Inf,0)     [0,1e+03) [1e+03,2e+03)  [2e+03, Inf) 
##             0          2934            10             1
summary(MOB3Data$MinLifetimePurchasesBin) #Minimum lifetime purchases bin
##   [-Inf,-2e+03) [-2e+03,-1e+03)      [-1e+03,0)       [0,1e+03)   [1e+03,2e+03) 
##               1               0             117            2827               0 
##    [2e+03, Inf) 
##               0
summary(MOB3Data$MinLifetimePaymentsBin) #Lifetime Payments bin
## [-Inf,-471) [-471,-271)  [-271,-71)  [-71, Inf) 
##           5          14          37        2889
summary(MOB3Data$MaxLifetimePaymentsBin) #Maximum lifetime payments bin
##        [-Inf,0)         [0,500)     [500,1e+03) [1e+03,1.5e+03)  [1.5e+03, Inf) 
##               0            2719             215               9               2
summary(MOB3Data$AvgLifetimePaymentsBin) #Average lifetime payments bin
##   [-Inf,0)    [0,200)  [200,400)  [400,600)  [600,800) [800, Inf) 
##          1       2903         39          1          0          1
summary(MOB3Data$AvgLifetimePurchasesBin) #Average lifetime purchases bin
##   [-Inf,0)    [0,200)  [200,400)  [400,600)  [600,800) [800, Inf) 
##          4       2903         36          1          0          1
dim(MOB3Data)
## [1] 2945   57
diagnose(MOB3Data)

One way to do it. I used the dlookr package for binning

Using Bscore

# optimal binning using character
bin <- binning_by(MOB3Data, "Bad", "Bscore")
bin
## binned type: optimal
## number of bins: 8
## x
## [234,241] (241,533] (533,558] (558,596] (596,618] (618,626] (626,658] (658,695] 
##       340       181       162       342       391       183       839       507
plot(bin, typographic = FALSE)

# extract binned results
extract(bin) %>% 
  head(20)
##  [1] (626,658] (626,658] (533,558] (241,533] (558,596] (596,618] (533,558]
##  [8] [234,241] [234,241] (533,558] (658,695] (596,618] (533,558] [234,241]
## [15] (658,695] (626,658] [234,241] (658,695] [234,241] (626,658]
## 8 Levels: [234,241] < (241,533] < (533,558] < (558,596] < ... < (658,695]

Using the Quaterly Credit card score

# optimal binning using character
qbin <- binning_by(MOB3Data, "Bad", "QuarterlyCreditScore")
qbin
## binned type: optimal
## number of bins: 3
## x
##   [0,571] (571,655] (655,791] 
##      1338      1291       316
plot(qbin, typographic = FALSE)

# optimal binning using character
tnpbin <- binning_by(MOB3Data, "Bad", "TotalNetPayments")
tnpbin
## binned type: optimal
## number of bins: 2
## x
##     [-550,10] (10,1.22e+03] 
##          1189          1756
plot(tnpbin, typographic = FALSE)

# optimal binning using character
ddbin <- binning_by(MOB3Data, "Bad", "DaysDeliq")
ddbin
## binned type: optimal
## number of bins: 4
## x
##  [-1,0]  (0,31] (31,61] (61,91] 
##    1782     475     305     383
plot(ddbin, typographic = FALSE)

# optimal binning using character
obbin <- binning_by(MOB3Data, "Bad", "OpeningBalance")
obbin
## binned type: optimal
## number of bins: 6
## x
## [-237,220]  (220,308]  (308,330]  (330,405]  (405,728]  (728,846] 
##        642        794        154        657        531        167
plot(obbin, typographic = FALSE)

library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ forcats 1.0.0     ✔ stringr 1.5.0
## ✔ ggplot2 3.4.1     ✔ tibble  3.1.8
## ✔ purrr   1.0.1     ✔ tidyr   1.3.0
## ✔ readr   2.1.4     
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ purrr::compose() masks flextable::compose()
## ✖ tidyr::extract() masks dlookr::extract()
## ✖ dplyr::filter()  masks stats::filter()
## ✖ dplyr::lag()     masks stats::lag()
## ℹ Use the ]8;;http://conflicted.r-lib.org/conflicted package]8;; to force all conflicts to become errors
newData <- MOB3Data %>% 
    rename("state" = "State")
library(usmap)
## Warning: package 'usmap' was built under R version 4.2.3
plot_usmap(data = newData, values = "Bad", labels = TRUE) 

library(caret)
## Loading required package: lattice
## 
## Attaching package: 'caret'
## The following object is masked from 'package:purrr':
## 
##     lift
library(randomForest)
## randomForest 4.7-1.1
## 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
df_new <- MOB3Data %>% select(c(5:21), 25)
diagnose(df_new)
# convert characters to factors
df_new$ExtStatus <- as.factor(df_new$ExtStatus)
df_new$IntStatus <- as.factor(df_new$IntStatus)

Feature selection using Boruta algorithm

library(Boruta)
boruta <- Boruta(Bad~., data = df_new, doTrace = 2) #using boruta
##  1. run of importance source...
##  2. run of importance source...
##  3. run of importance source...
##  4. run of importance source...
##  5. run of importance source...
##  6. run of importance source...
##  7. run of importance source...
##  8. run of importance source...
##  9. run of importance source...
##  10. run of importance source...
##  11. run of importance source...
## After 11 iterations, +11 secs:
##  confirmed 15 attributes: ActualMinPay, BillLateCharge, Bscore, CreditLimit, DaysDeliq and 10 more;
##  rejected 1 attribute: MOB;
##  still have 1 attribute left.
##  12. run of importance source...
##  13. run of importance source...
##  14. run of importance source...
##  15. run of importance source...
## After 15 iterations, +15 secs:
##  confirmed 1 attribute: Concessions;
##  no more attributes left.
print(boruta)
## Boruta performed 15 iterations in 14.61622 secs.
##  16 attributes confirmed important: ActualMinPay, BillLateCharge,
## Bscore, Concessions, CreditLimit and 11 more;
##  1 attributes confirmed unimportant: MOB;
plot(boruta, xlab = "", xaxt = "n")
lz<-lapply(1:ncol(boruta$ImpHistory),function(i)
boruta$ImpHistory[is.finite(boruta$ImpHistory[,i]),i])
names(lz) <- colnames(boruta$ImpHistory)
Labels <- sort(sapply(lz,median))
axis(side = 1,las=2,labels = names(Labels),
at = 1:ncol(boruta$ImpHistory), cex.axis = 0.7)

model_df <- df_new %>% select(-1) # remove MOB
#load required libraries
library(dlookr)
library(tidyverse)
library(caret)
library(GGally)
## Registered S3 method overwritten by 'GGally':
##   method from   
##   +.gg   ggplot2
library(rstatix)
## 
## Attaching package: 'rstatix'
## The following object is masked from 'package:stats':
## 
##     filter
library(UpSetR)
## 
## Attaching package: 'UpSetR'
## The following object is masked from 'package:lattice':
## 
##     histogram
library(naniar)

library(Hmisc)
## Loading required package: survival
## 
## Attaching package: 'survival'
## The following object is masked from 'package:caret':
## 
##     cluster
## Loading required package: Formula
## 
## Attaching package: 'Hmisc'
## The following object is masked from 'package:dlookr':
## 
##     describe
## The following objects are masked from 'package:dplyr':
## 
##     src, summarize
## The following objects are masked from 'package:base':
## 
##     format.pval, units
library(VIM)
## Loading required package: colorspace
## Loading required package: grid
## VIM is ready to use.
## Suggestions and bug-reports can be submitted at: https://github.com/statistikat/VIM/issues
## 
## Attaching package: 'VIM'
## The following object is masked from 'package:datasets':
## 
##     sleep
library(RWeka)
library(mice)
## 
## Attaching package: 'mice'
## The following object is masked from 'package:stats':
## 
##     filter
## The following objects are masked from 'package:base':
## 
##     cbind, rbind
library(tree)
library(partykit)
## Loading required package: libcoin
## Loading required package: mvtnorm
## 
## Attaching package: 'partykit'
## The following object is masked from 'package:flextable':
## 
##     width
library(maptree)
## Loading required package: cluster
## Loading required package: rpart
library(blorr)
library(pROC)
## Type 'citation("pROC")' for a citation.
## 
## Attaching package: 'pROC'
## The following object is masked from 'package:colorspace':
## 
##     coords
## The following objects are masked from 'package:stats':
## 
##     cov, smooth, var
library(rpart.plot)
library(sjPlot)
library(flextable)

model building

# model building
model_df <- model_df %>% mutate(bad = case_when(Bad == 0 ~ "No",
                                                     Bad == 1 ~ "Yes")) #recode Bad as yes and no
model_df <- model_df[, -17] #remove Bad
# split the data

set.seed(123)
training.samples <- model_df$bad %>% createDataPartition(p = 0.6, list = FALSE)
train <- model_df[training.samples, ]
test <- model_df[-training.samples, ]
oj_trControl = trainControl(
  method = "cv",
  number = 10,
  savePredictions = "final",       # save preds for the optimal tuning parameter
  classProbs = TRUE,  # class probs in addition to preds
  summaryFunction = twoClassSummary
)
# build a tree model
set.seed(1234)
tree_mod1 <- train(
  bad ~ ., 
  data = train, 
  method = "rpart",
  tuneLength = 5,
  metric = "ROC",
  trControl = oj_trControl
)
print(tree_mod1)
## CART 
## 
## 1768 samples
##   16 predictor
##    2 classes: 'No', 'Yes' 
## 
## No pre-processing
## Resampling: Cross-Validated (10 fold) 
## Summary of sample sizes: 1592, 1591, 1591, 1591, 1591, 1591, ... 
## Resampling results across tuning parameters:
## 
##   cp           ROC        Sens       Spec     
##   0.002638522  0.8415361  0.8881188  0.6794211
##   0.003298153  0.8390793  0.8881188  0.6820175
##   0.003957784  0.8383830  0.8970297  0.6767544
##   0.005277045  0.8124698  0.9178218  0.6488772
##   0.564643799  0.6319360  0.9584158  0.3054561
## 
## ROC was used to select the optimal model using the largest value.
## The final value used for the model was cp = 0.002638522.
tree_mod1$finalModel # check the final model
## n= 1768 
## 
## node), split, n, loss, yval, (yprob)
##       * denotes terminal node
## 
##     1) root 1768 758 No (0.57126697 0.42873303)  
##       2) Bscore>=590.5 1222 271 No (0.77823241 0.22176759)  
##         4) Bscore>=622.5 880 129 No (0.85340909 0.14659091) *
##         5) Bscore< 622.5 342 142 No (0.58479532 0.41520468)  
##          10) QuarterlyCreditScore>=657.5 19   1 No (0.94736842 0.05263158) *
##          11) QuarterlyCreditScore< 657.5 323 141 No (0.56346749 0.43653251)  
##            22) OverlimitAmount< 37.825 275 111 No (0.59636364 0.40363636)  
##              44) EndingBalance< 204.65 19   3 No (0.84210526 0.15789474) *
##              45) EndingBalance>=204.65 256 108 No (0.57812500 0.42187500)  
##                90) TotalNetPurchaseAndCash< 299.605 249 102 No (0.59036145 0.40963855)  
##                 180) EndingBalance>=353.635 69  20 No (0.71014493 0.28985507)  
##                   360) OpeningBalance< 668.25 32   3 No (0.90625000 0.09375000) *
##                   361) OpeningBalance>=668.25 37  17 No (0.54054054 0.45945946)  
##                     722) TotalFeesBilled< 25.28 16   4 No (0.75000000 0.25000000) *
##                     723) TotalFeesBilled>=25.28 21   8 Yes (0.38095238 0.61904762) *
##                 181) EndingBalance< 353.635 180  82 No (0.54444444 0.45555556)  
##                   362) QuarterlyCreditScore< 607 145  58 No (0.60000000 0.40000000)  
##                     724) TotalFeesBilled< 37.385 116  40 No (0.65517241 0.34482759)  
##                      1448) TotalNetPurchaseAndCash>=235.15 13   1 No (0.92307692 0.07692308) *
##                      1449) TotalNetPurchaseAndCash< 235.15 103  39 No (0.62135922 0.37864078)  
##                        2898) TotalNetPayments< 47.5 58  15 No (0.74137931 0.25862069) *
##                        2899) TotalNetPayments>=47.5 45  21 Yes (0.46666667 0.53333333)  
##                          5798) TotalFeesBilled< 11.275 34  15 No (0.55882353 0.44117647)  
##                           11596) Bscore< 614.5 23   7 No (0.69565217 0.30434783) *
##                           11597) Bscore>=614.5 11   3 Yes (0.27272727 0.72727273) *
##                          5799) TotalFeesBilled>=11.275 11   2 Yes (0.18181818 0.81818182) *
##                     725) TotalFeesBilled>=37.385 29  11 Yes (0.37931034 0.62068966) *
##                   363) QuarterlyCreditScore>=607 35  11 Yes (0.31428571 0.68571429)  
##                     726) QuarterlyCreditScore>=619.5 24  11 Yes (0.45833333 0.54166667)  
##                      1452) EndingBalance< 279.625 9   2 No (0.77777778 0.22222222) *
##                      1453) EndingBalance>=279.625 15   4 Yes (0.26666667 0.73333333) *
##                     727) QuarterlyCreditScore< 619.5 11   0 Yes (0.00000000 1.00000000) *
##                91) TotalNetPurchaseAndCash>=299.605 7   1 Yes (0.14285714 0.85714286) *
##            23) OverlimitAmount>=37.825 48  18 Yes (0.37500000 0.62500000)  
##              46) ActualMinPay>=99.5 11   2 No (0.81818182 0.18181818) *
##              47) ActualMinPay< 99.5 37   9 Yes (0.24324324 0.75675676)  
##                94) TotalNetPurchaseAndCash>=83.82 7   2 No (0.71428571 0.28571429) *
##                95) TotalNetPurchaseAndCash< 83.82 30   4 Yes (0.13333333 0.86666667) *
##       3) Bscore< 590.5 546  59 Yes (0.10805861 0.89194139)  
##         6) EndingBalance< 340.95 95  38 Yes (0.40000000 0.60000000)  
##          12) DisplayMinPay< 90.875 46  20 No (0.56521739 0.43478261)  
##            24) EndingBalance< 284.26 12   1 No (0.91666667 0.08333333) *
##            25) EndingBalance>=284.26 34  15 Yes (0.44117647 0.55882353)  
##              50) DisplayMinPay>=85.09 13   3 No (0.76923077 0.23076923) *
##              51) DisplayMinPay< 85.09 21   5 Yes (0.23809524 0.76190476) *
##          13) DisplayMinPay>=90.875 49  12 Yes (0.24489796 0.75510204)  
##            26) TotalFeesBilled< 36.975 20  10 No (0.50000000 0.50000000)  
##              52) OverlimitAmount>=33.49 13   3 No (0.76923077 0.23076923) *
##              53) OverlimitAmount< 33.49 7   0 Yes (0.00000000 1.00000000) *
##            27) TotalFeesBilled>=36.975 29   2 Yes (0.06896552 0.93103448) *
##         7) EndingBalance>=340.95 451  21 Yes (0.04656319 0.95343681) *
# plot the decision tree model
rpart.plot(tree_mod1$finalModel)

prp(tree_mod1$finalModel)

train$bad <-as.factor(train$bad)
tree.carseats <- tree(bad ~ ., train)
summary(tree.carseats)
## 
## Classification tree:
## tree(formula = bad ~ ., data = train)
## Variables actually used in tree construction:
## [1] "Bscore"
## Number of terminal nodes:  5 
## Residual mean deviance:  0.8296 = 1463 / 1763 
## Misclassification error rate: 0.1867 = 330 / 1768
plot(tree.carseats)
text(tree.carseats , pretty = 0)

# compute confusion matrix
treemod1_cart1 <- bind_cols(
  predict(tree_mod1, newdata = test, type = "prob"),
  Predicted = predict(tree_mod1, newdata = test, type = "raw"),
  Actual = test$bad
)

treemod1_cart1$Actual <- as.factor(treemod1_cart1$Actual)
treemod1_cart2 <- confusionMatrix(treemod1_cart1$Predicted, treemod1_cart1$Actual)
treemod1_cart2
## Confusion Matrix and Statistics
## 
##           Reference
## Prediction  No Yes
##        No  576 150
##        Yes  96 355
##                                           
##                Accuracy : 0.791           
##                  95% CI : (0.7666, 0.8139)
##     No Information Rate : 0.5709          
##     P-Value [Acc > NIR] : < 2.2e-16       
##                                           
##                   Kappa : 0.5677          
##                                           
##  Mcnemar's Test P-Value : 0.0007271       
##                                           
##             Sensitivity : 0.8571          
##             Specificity : 0.7030          
##          Pos Pred Value : 0.7934          
##          Neg Pred Value : 0.7871          
##              Prevalence : 0.5709          
##          Detection Rate : 0.4894          
##    Detection Prevalence : 0.6168          
##       Balanced Accuracy : 0.7801          
##                                           
##        'Positive' Class : No              
## 
# plot the roc curve
mdl_auc <- Metrics::auc(actual = treemod1_cart1$Actual == "No", treemod1_cart1$No)
yardstick::roc_curve(treemod1_cart1, Actual, No) %>%
  autoplot() +
  labs(
    title = "tree1 ROC Curve ",
    subtitle = paste0("AUC = ", round(mdl_auc, 4))
  )
## Warning: Returning more (or less) than 1 row per `summarise()` group was deprecated in
## dplyr 1.1.0.
## ℹ Please use `reframe()` instead.
## ℹ When switching from `summarise()` to `reframe()`, remember that `reframe()`
##   always returns an ungrouped data frame and adjust accordingly.
## ℹ The deprecated feature was likely used in the yardstick package.
##   Please report the issue at <]8;;https://github.com/tidymodels/yardstick/issueshttps://github.com/tidymodels/yardstick/issues]8;;>.

# visualize variable importance


plot(varImp(tree_mod1), main="Variable Importance with tree1")

set.seed(1234)
logit_mod1 <- train(
  bad ~ ., 
  data = train, 
  method = "glmStepAIC",
  tuneLength = 5,
  metric = "ROC",
  trControl = oj_trControl
)
## Start:  AIC=1264.3
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     ExtStatusZ + IntStatusD + IntStatusN + IntStatusO + IntStatusX + 
##     DaysDeliq + ActualMinPay + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
## 
## Step:  AIC=1264.3
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     ActualMinPay + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     BillLateCharge + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ActualMinPay             1   1218.3 1262.3
## - TotalNetPurchaseAndCash  1   1218.3 1262.3
## - DisplayMinPay            1   1218.3 1262.3
## - OverlimitAmount          1   1218.3 1262.3
## - TotalNetPayments         1   1218.4 1262.4
## - OpeningBalance           1   1218.5 1262.5
## - ExtStatusF               1   1218.5 1262.5
## - ExtStatusE               1   1218.5 1262.5
## - BillLateCharge           1   1218.6 1262.6
## - IntStatusO               1   1218.8 1262.8
## - IntStatusN               1   1218.9 1262.9
## - ExtStatusC               1   1219.0 1263.0
## - EndingBalance            1   1219.5 1263.5
## - ExtStatusI               1   1220.0 1264.0
## <none>                         1218.3 1264.3
## - IntStatusD               1   1221.0 1265.0
## - Concessions              1   1221.2 1265.2
## - IntStatusX               1   1221.3 1265.3
## - DaysDeliq                1   1222.5 1266.5
## - TotalFeesBilled          1   1222.9 1266.9
## - QuarterlyCreditScore     1   1224.7 1268.7
## - Bscore                   1   1226.2 1270.2
## - CreditLimit              1   1255.2 1299.2
## 
## Step:  AIC=1262.3
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - TotalNetPurchaseAndCash  1   1218.3 1260.3
## - TotalNetPayments         1   1218.4 1260.4
## - OpeningBalance           1   1218.5 1260.5
## - ExtStatusF               1   1218.5 1260.5
## - ExtStatusE               1   1218.5 1260.5
## - BillLateCharge           1   1218.6 1260.6
## - IntStatusO               1   1218.8 1260.8
## - IntStatusN               1   1218.9 1260.9
## - ExtStatusC               1   1219.0 1261.0
## - EndingBalance            1   1219.5 1261.5
## - ExtStatusI               1   1220.0 1262.0
## <none>                         1218.3 1262.3
## - DisplayMinPay            1   1220.9 1262.9
## - IntStatusD               1   1221.0 1263.0
## - Concessions              1   1221.2 1263.2
## - IntStatusX               1   1221.3 1263.3
## - DaysDeliq                1   1222.5 1264.5
## - OverlimitAmount          1   1222.6 1264.6
## - TotalFeesBilled          1   1222.9 1264.9
## - QuarterlyCreditScore     1   1224.7 1266.7
## - Bscore                   1   1226.2 1268.2
## - CreditLimit              1   1255.2 1297.2
## 
## Step:  AIC=1260.3
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusF            1   1218.5 1258.5
## - ExtStatusE            1   1218.5 1258.5
## - BillLateCharge        1   1218.6 1258.6
## - IntStatusO            1   1218.8 1258.8
## - IntStatusN            1   1218.9 1258.9
## - ExtStatusC            1   1219.0 1259.0
## - ExtStatusI            1   1220.0 1260.0
## <none>                      1218.3 1260.3
## - TotalNetPayments      1   1220.6 1260.6
## - DisplayMinPay         1   1220.9 1260.9
## - IntStatusD            1   1221.0 1261.0
## - IntStatusX            1   1221.3 1261.3
## - Concessions           1   1221.9 1261.9
## - OpeningBalance        1   1222.1 1262.1
## - DaysDeliq             1   1222.5 1262.5
## - OverlimitAmount       1   1222.7 1262.7
## - TotalFeesBilled       1   1224.0 1264.0
## - QuarterlyCreditScore  1   1224.8 1264.8
## - Bscore                1   1226.2 1266.2
## - EndingBalance         1   1229.8 1269.8
## - CreditLimit           1   1255.3 1295.3
## 
## Step:  AIC=1258.51
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusO + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + BillLateCharge + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusE            1   1218.7 1256.7
## - BillLateCharge        1   1218.8 1256.8
## - IntStatusO            1   1219.0 1257.0
## - IntStatusN            1   1219.1 1257.1
## - ExtStatusC            1   1219.2 1257.2
## - ExtStatusI            1   1220.2 1258.2
## <none>                      1218.5 1258.5
## - TotalNetPayments      1   1220.8 1258.8
## - DisplayMinPay         1   1221.1 1259.1
## - IntStatusD            1   1221.3 1259.3
## - IntStatusX            1   1221.6 1259.6
## - Concessions           1   1222.0 1260.0
## - OpeningBalance        1   1222.3 1260.3
## - DaysDeliq             1   1222.6 1260.6
## - OverlimitAmount       1   1222.8 1260.8
## - TotalFeesBilled       1   1224.3 1262.3
## - QuarterlyCreditScore  1   1224.9 1262.9
## - Bscore                1   1228.9 1266.9
## - EndingBalance         1   1230.0 1268.0
## - CreditLimit           1   1255.4 1293.4
## 
## Step:  AIC=1256.73
## .outcome ~ ExtStatusC + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusO + IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## - BillLateCharge        1   1219.0 1255.0
## - IntStatusO            1   1219.3 1255.3
## - IntStatusN            1   1219.3 1255.3
## - ExtStatusC            1   1219.4 1255.4
## - ExtStatusI            1   1220.4 1256.4
## <none>                      1218.7 1256.7
## - TotalNetPayments      1   1221.0 1257.0
## - DisplayMinPay         1   1221.4 1257.4
## - IntStatusD            1   1221.6 1257.6
## - IntStatusX            1   1221.9 1257.9
## - Concessions           1   1222.2 1258.2
## - OpeningBalance        1   1222.5 1258.5
## - DaysDeliq             1   1222.9 1258.9
## - OverlimitAmount       1   1223.1 1259.1
## - TotalFeesBilled       1   1224.5 1260.5
## - QuarterlyCreditScore  1   1225.3 1261.3
## - Bscore                1   1229.0 1265.0
## - EndingBalance         1   1230.2 1266.2
## - CreditLimit           1   1255.7 1291.7
## 
## Step:  AIC=1255.05
## .outcome ~ ExtStatusC + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusO + IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusO            1   1219.6 1253.6
## - IntStatusN            1   1219.7 1253.7
## - ExtStatusC            1   1219.7 1253.7
## - ExtStatusI            1   1220.7 1254.7
## <none>                      1219.0 1255.0
## - TotalNetPayments      1   1221.4 1255.4
## - DisplayMinPay         1   1221.6 1255.6
## - IntStatusD            1   1221.7 1255.7
## - IntStatusX            1   1221.9 1255.9
## - Concessions           1   1222.6 1256.6
## - OpeningBalance        1   1222.8 1256.8
## - OverlimitAmount       1   1223.2 1257.2
## - DaysDeliq             1   1223.5 1257.5
## - QuarterlyCreditScore  1   1225.6 1259.6
## - Bscore                1   1229.2 1263.2
## - EndingBalance         1   1230.2 1264.2
## - TotalFeesBilled       1   1236.9 1270.9
## - CreditLimit           1   1256.6 1290.6
## 
## Step:  AIC=1253.58
## .outcome ~ ExtStatusC + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusC            1   1220.2 1252.2
## - IntStatusN            1   1220.2 1252.2
## - ExtStatusI            1   1221.2 1253.2
## <none>                      1219.6 1253.6
## - TotalNetPayments      1   1221.8 1253.8
## - DisplayMinPay         1   1221.9 1253.9
## - IntStatusX            1   1222.1 1254.1
## - IntStatusD            1   1222.5 1254.5
## - Concessions           1   1223.2 1255.2
## - OverlimitAmount       1   1223.4 1255.4
## - OpeningBalance        1   1223.5 1255.5
## - DaysDeliq             1   1224.3 1256.3
## - QuarterlyCreditScore  1   1226.2 1258.2
## - Bscore                1   1229.2 1261.2
## - EndingBalance         1   1230.3 1262.3
## - TotalFeesBilled       1   1237.6 1269.6
## - CreditLimit           1   1257.0 1289.0
## 
## Step:  AIC=1252.17
## .outcome ~ ExtStatusI + IntStatusD + IntStatusN + IntStatusX + 
##     DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusN            1   1220.8 1250.8
## - ExtStatusI            1   1221.8 1251.8
## <none>                      1220.2 1252.2
## - TotalNetPayments      1   1222.3 1252.3
## - DisplayMinPay         1   1222.5 1252.5
## - IntStatusX            1   1222.7 1252.7
## - IntStatusD            1   1223.1 1253.1
## - Concessions           1   1223.7 1253.7
## - OpeningBalance        1   1224.1 1254.1
## - OverlimitAmount       1   1224.3 1254.3
## - DaysDeliq             1   1225.0 1255.0
## - QuarterlyCreditScore  1   1226.9 1256.9
## - Bscore                1   1230.0 1260.0
## - EndingBalance         1   1230.7 1260.7
## - TotalFeesBilled       1   1237.8 1267.8
## - CreditLimit           1   1257.0 1287.0
## 
## Step:  AIC=1250.75
## .outcome ~ ExtStatusI + IntStatusD + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusI            1   1222.4 1250.4
## <none>                      1220.8 1250.8
## - DisplayMinPay         1   1223.0 1251.0
## - TotalNetPayments      1   1223.0 1251.0
## - IntStatusX            1   1223.3 1251.3
## - IntStatusD            1   1223.7 1251.7
## - Concessions           1   1224.3 1252.3
## - OpeningBalance        1   1224.6 1252.6
## - OverlimitAmount       1   1224.7 1252.7
## - DaysDeliq             1   1225.4 1253.4
## - QuarterlyCreditScore  1   1227.5 1255.5
## - Bscore                1   1230.7 1258.7
## - EndingBalance         1   1231.7 1259.7
## - TotalFeesBilled       1   1238.5 1266.5
## - CreditLimit           1   1258.7 1286.7
## 
## Step:  AIC=1250.4
## .outcome ~ IntStatusD + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## <none>                      1222.4 1250.4
## - TotalNetPayments      1   1224.6 1250.6
## - DisplayMinPay         1   1224.7 1250.7
## - IntStatusX            1   1224.7 1250.7
## - IntStatusD            1   1225.2 1251.2
## - Concessions           1   1226.0 1252.0
## - OverlimitAmount       1   1226.3 1252.3
## - OpeningBalance        1   1226.4 1252.4
## - DaysDeliq             1   1227.1 1253.1
## - QuarterlyCreditScore  1   1229.1 1255.1
## - Bscore                1   1232.7 1258.7
## - EndingBalance         1   1233.3 1259.3
## - TotalFeesBilled       1   1239.2 1265.2
## - CreditLimit           1   1260.1 1286.1
## Start:  AIC=1325
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     ExtStatusZ + IntStatusD + IntStatusN + IntStatusO + IntStatusX + 
##     DaysDeliq + ActualMinPay + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
## 
## Step:  AIC=1325
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     ActualMinPay + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     BillLateCharge + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ActualMinPay             1   1279.0 1323.0
## - TotalNetPurchaseAndCash  1   1279.0 1323.0
## - TotalNetPayments         1   1279.0 1323.0
## - DisplayMinPay            1   1279.0 1323.0
## - OverlimitAmount          1   1279.1 1323.1
## - IntStatusO               1   1279.1 1323.1
## - ExtStatusE               1   1279.1 1323.1
## - OpeningBalance           1   1279.2 1323.2
## - BillLateCharge           1   1279.3 1323.3
## - ExtStatusC               1   1279.4 1323.4
## - EndingBalance            1   1279.8 1323.8
## - IntStatusD               1   1279.9 1323.9
## - IntStatusN               1   1279.9 1323.9
## - ExtStatusF               1   1280.2 1324.2
## - ExtStatusI               1   1280.6 1324.6
## <none>                         1279.0 1325.0
## - IntStatusX               1   1281.5 1325.5
## - Concessions              1   1281.6 1325.6
## - TotalFeesBilled          1   1281.9 1325.9
## - QuarterlyCreditScore     1   1282.5 1326.5
## - DaysDeliq                1   1284.7 1328.7
## - Bscore                   1   1285.1 1329.1
## - CreditLimit              1   1310.7 1354.7
## 
## Step:  AIC=1323
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - TotalNetPurchaseAndCash  1   1279.0 1321.0
## - TotalNetPayments         1   1279.0 1321.0
## - IntStatusO               1   1279.1 1321.1
## - ExtStatusE               1   1279.1 1321.1
## - OpeningBalance           1   1279.2 1321.2
## - BillLateCharge           1   1279.3 1321.3
## - ExtStatusC               1   1279.4 1321.4
## - EndingBalance            1   1279.8 1321.8
## - IntStatusD               1   1279.9 1321.9
## - IntStatusN               1   1279.9 1321.9
## - ExtStatusF               1   1280.2 1322.2
## - ExtStatusI               1   1280.6 1322.6
## <none>                         1279.0 1323.0
## - IntStatusX               1   1281.5 1323.5
## - Concessions              1   1281.6 1323.6
## - TotalFeesBilled          1   1281.9 1323.9
## - QuarterlyCreditScore     1   1282.5 1324.5
## - DisplayMinPay            1   1282.8 1324.8
## - DaysDeliq                1   1284.7 1326.7
## - Bscore                   1   1285.1 1327.1
## - OverlimitAmount          1   1285.3 1327.3
## - CreditLimit              1   1310.7 1352.7
## 
## Step:  AIC=1321
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusO            1   1279.1 1319.1
## - ExtStatusE            1   1279.1 1319.1
## - BillLateCharge        1   1279.3 1319.3
## - TotalNetPayments      1   1279.4 1319.4
## - ExtStatusC            1   1279.4 1319.4
## - IntStatusD            1   1279.9 1319.9
## - IntStatusN            1   1279.9 1319.9
## - ExtStatusF            1   1280.2 1320.2
## - ExtStatusI            1   1280.6 1320.6
## <none>                      1279.0 1321.0
## - IntStatusX            1   1281.5 1321.5
## - Concessions           1   1282.2 1322.2
## - QuarterlyCreditScore  1   1282.5 1322.5
## - TotalFeesBilled       1   1282.5 1322.5
## - DisplayMinPay         1   1282.8 1322.8
## - OpeningBalance        1   1282.8 1322.8
## - DaysDeliq             1   1284.7 1324.7
## - Bscore                1   1285.1 1325.1
## - OverlimitAmount       1   1285.3 1325.3
## - EndingBalance         1   1287.4 1327.4
## - CreditLimit           1   1310.8 1350.8
## 
## Step:  AIC=1319.06
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + BillLateCharge + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusE            1   1279.1 1317.1
## - BillLateCharge        1   1279.4 1317.4
## - TotalNetPayments      1   1279.5 1317.5
## - ExtStatusC            1   1279.5 1317.5
## - IntStatusN            1   1280.0 1318.0
## - IntStatusD            1   1280.0 1318.0
## - ExtStatusF            1   1280.2 1318.2
## - ExtStatusI            1   1280.7 1318.7
## <none>                      1279.1 1319.1
## - IntStatusX            1   1281.5 1319.5
## - Concessions           1   1282.3 1320.3
## - QuarterlyCreditScore  1   1282.5 1320.5
## - TotalFeesBilled       1   1282.6 1320.6
## - DisplayMinPay         1   1282.8 1320.8
## - OpeningBalance        1   1283.0 1321.0
## - DaysDeliq             1   1284.9 1322.9
## - Bscore                1   1285.2 1323.2
## - OverlimitAmount       1   1285.3 1323.3
## - EndingBalance         1   1287.8 1325.8
## - CreditLimit           1   1311.8 1349.8
## 
## Step:  AIC=1317.14
## .outcome ~ ExtStatusC + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## - BillLateCharge        1   1279.5 1315.5
## - TotalNetPayments      1   1279.5 1315.5
## - ExtStatusC            1   1279.6 1315.6
## - IntStatusN            1   1280.1 1316.1
## - IntStatusD            1   1280.1 1316.1
## - ExtStatusF            1   1280.3 1316.3
## - ExtStatusI            1   1280.8 1316.8
## <none>                      1279.1 1317.1
## - IntStatusX            1   1281.6 1317.6
## - Concessions           1   1282.4 1318.4
## - QuarterlyCreditScore  1   1282.6 1318.6
## - TotalFeesBilled       1   1282.7 1318.7
## - DisplayMinPay         1   1282.9 1318.9
## - OpeningBalance        1   1283.1 1319.1
## - DaysDeliq             1   1285.0 1321.0
## - Bscore                1   1285.2 1321.2
## - OverlimitAmount       1   1285.5 1321.5
## - EndingBalance         1   1287.9 1323.9
## - CreditLimit           1   1311.9 1347.9
## 
## Step:  AIC=1315.48
## .outcome ~ ExtStatusC + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusC            1   1279.9 1313.9
## - TotalNetPayments      1   1279.9 1313.9
## - IntStatusD            1   1280.3 1314.3
## - IntStatusN            1   1280.4 1314.4
## - ExtStatusF            1   1280.7 1314.7
## - ExtStatusI            1   1281.1 1315.1
## <none>                      1279.5 1315.5
## - IntStatusX            1   1281.7 1315.7
## - Concessions           1   1282.7 1316.7
## - QuarterlyCreditScore  1   1283.0 1317.0
## - DisplayMinPay         1   1283.1 1317.1
## - OpeningBalance        1   1283.3 1317.3
## - Bscore                1   1285.4 1319.4
## - DaysDeliq             1   1285.6 1319.6
## - OverlimitAmount       1   1285.6 1319.6
## - EndingBalance         1   1287.9 1321.9
## - TotalFeesBilled       1   1291.8 1325.8
## - CreditLimit           1   1312.7 1346.7
## 
## Step:  AIC=1313.87
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - TotalNetPayments      1   1280.3 1312.3
## - IntStatusD            1   1280.7 1312.7
## - IntStatusN            1   1280.8 1312.8
## - ExtStatusF            1   1281.2 1313.2
## - ExtStatusI            1   1281.5 1313.5
## <none>                      1279.9 1313.9
## - IntStatusX            1   1282.1 1314.1
## - Concessions           1   1283.0 1315.0
## - QuarterlyCreditScore  1   1283.4 1315.4
## - DisplayMinPay         1   1283.6 1315.6
## - OpeningBalance        1   1283.7 1315.7
## - DaysDeliq             1   1286.1 1318.1
## - Bscore                1   1286.2 1318.2
## - OverlimitAmount       1   1286.4 1318.4
## - EndingBalance         1   1288.0 1320.0
## - TotalFeesBilled       1   1291.9 1323.9
## - CreditLimit           1   1312.8 1344.8
## 
## Step:  AIC=1312.3
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusN            1   1281.2 1311.2
## - IntStatusD            1   1281.3 1311.3
## - ExtStatusF            1   1281.6 1311.6
## - ExtStatusI            1   1281.8 1311.8
## <none>                      1280.3 1312.3
## - IntStatusX            1   1282.6 1312.6
## - QuarterlyCreditScore  1   1284.0 1314.0
## - DisplayMinPay         1   1284.1 1314.1
## - Concessions           1   1284.1 1314.1
## - OpeningBalance        1   1285.7 1315.7
## - DaysDeliq             1   1286.4 1316.4
## - Bscore                1   1286.6 1316.6
## - OverlimitAmount       1   1287.0 1317.0
## - EndingBalance         1   1288.7 1318.7
## - TotalFeesBilled       1   1292.0 1322.0
## - CreditLimit           1   1313.7 1343.7
## 
## Step:  AIC=1311.21
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusX + 
##     DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusD            1   1282.2 1310.2
## - ExtStatusF            1   1282.5 1310.5
## - ExtStatusI            1   1282.8 1310.8
## <none>                      1281.2 1311.2
## - IntStatusX            1   1283.5 1311.5
## - DisplayMinPay         1   1284.7 1312.7
## - QuarterlyCreditScore  1   1285.0 1313.0
## - Concessions           1   1285.2 1313.2
## - OpeningBalance        1   1286.6 1314.6
## - DaysDeliq             1   1287.1 1315.1
## - OverlimitAmount       1   1287.5 1315.5
## - Bscore                1   1287.6 1315.6
## - EndingBalance         1   1290.0 1318.0
## - TotalFeesBilled       1   1292.9 1320.9
## - CreditLimit           1   1315.8 1343.8
## 
## Step:  AIC=1310.18
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + EndingBalance + 
##     CreditLimit + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusF            1   1283.2 1309.2
## - IntStatusX            1   1283.5 1309.5
## - ExtStatusI            1   1283.7 1309.7
## <none>                      1282.2 1310.2
## - DisplayMinPay         1   1285.7 1311.7
## - QuarterlyCreditScore  1   1286.0 1312.0
## - Concessions           1   1286.1 1312.1
## - DaysDeliq             1   1287.3 1313.3
## - OpeningBalance        1   1288.3 1314.3
## - Bscore                1   1289.4 1315.4
## - OverlimitAmount       1   1289.5 1315.5
## - EndingBalance         1   1290.5 1316.5
## - TotalFeesBilled       1   1293.0 1319.0
## - CreditLimit           1   1316.7 1342.7
## 
## Step:  AIC=1309.23
## .outcome ~ ExtStatusI + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + EndingBalance + CreditLimit + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusX            1   1284.6 1308.6
## - ExtStatusI            1   1284.8 1308.8
## <none>                      1283.2 1309.2
## - DisplayMinPay         1   1286.9 1310.9
## - QuarterlyCreditScore  1   1287.3 1311.3
## - Concessions           1   1287.4 1311.4
## - DaysDeliq             1   1289.1 1313.1
## - Bscore                1   1289.8 1313.8
## - OpeningBalance        1   1290.0 1314.0
## - OverlimitAmount       1   1290.8 1314.8
## - EndingBalance         1   1292.4 1316.4
## - TotalFeesBilled       1   1294.2 1318.2
## - CreditLimit           1   1321.0 1345.0
## 
## Step:  AIC=1308.59
## .outcome ~ ExtStatusI + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusI            1   1285.9 1307.9
## <none>                      1284.6 1308.6
## - DisplayMinPay         1   1287.8 1309.8
## - QuarterlyCreditScore  1   1288.7 1310.7
## - Concessions           1   1288.7 1310.7
## - DaysDeliq             1   1289.1 1311.1
## - OverlimitAmount       1   1291.2 1313.2
## - OpeningBalance        1   1291.3 1313.3
## - EndingBalance         1   1292.6 1314.6
## - TotalFeesBilled       1   1294.5 1316.5
## - Bscore                1   1295.3 1317.3
## - CreditLimit           1   1321.3 1343.3
## 
## Step:  AIC=1307.94
## .outcome ~ DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## <none>                      1285.9 1307.9
## - DisplayMinPay         1   1289.2 1309.2
## - QuarterlyCreditScore  1   1290.0 1310.0
## - Concessions           1   1290.0 1310.0
## - DaysDeliq             1   1290.8 1310.8
## - OverlimitAmount       1   1292.6 1312.6
## - OpeningBalance        1   1292.8 1312.8
## - EndingBalance         1   1294.2 1314.2
## - TotalFeesBilled       1   1295.3 1315.3
## - Bscore                1   1296.6 1316.6
## - CreditLimit           1   1323.0 1343.0
## Start:  AIC=1320.73
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     ExtStatusZ + IntStatusD + IntStatusN + IntStatusO + IntStatusX + 
##     DaysDeliq + ActualMinPay + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
## 
## Step:  AIC=1320.73
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     ActualMinPay + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     BillLateCharge + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ActualMinPay             1   1274.7 1318.7
## - DisplayMinPay            1   1274.7 1318.7
## - TotalNetPurchaseAndCash  1   1274.8 1318.8
## - TotalNetPayments         1   1274.8 1318.8
## - ExtStatusC               1   1274.8 1318.8
## - OverlimitAmount          1   1274.8 1318.8
## - IntStatusO               1   1274.8 1318.8
## - BillLateCharge           1   1274.9 1318.9
## - ExtStatusE               1   1275.0 1319.0
## - OpeningBalance           1   1275.0 1319.0
## - ExtStatusF               1   1275.3 1319.3
## - IntStatusN               1   1275.5 1319.5
## - EndingBalance            1   1275.7 1319.7
## - ExtStatusI               1   1276.3 1320.3
## - Concessions              1   1276.4 1320.4
## - IntStatusD               1   1276.5 1320.5
## <none>                         1274.7 1320.7
## - IntStatusX               1   1276.9 1320.9
## - TotalFeesBilled          1   1277.7 1321.7
## - Bscore                   1   1280.4 1324.4
## - QuarterlyCreditScore     1   1280.8 1324.8
## - DaysDeliq                1   1281.6 1325.6
## - CreditLimit              1   1310.6 1354.6
## 
## Step:  AIC=1318.73
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - TotalNetPurchaseAndCash  1   1274.8 1316.8
## - TotalNetPayments         1   1274.8 1316.8
## - ExtStatusC               1   1274.8 1316.8
## - IntStatusO               1   1274.8 1316.8
## - BillLateCharge           1   1274.9 1316.9
## - ExtStatusE               1   1275.0 1317.0
## - OpeningBalance           1   1275.0 1317.0
## - ExtStatusF               1   1275.3 1317.3
## - IntStatusN               1   1275.5 1317.5
## - EndingBalance            1   1275.7 1317.7
## - ExtStatusI               1   1276.3 1318.3
## - Concessions              1   1276.4 1318.4
## - IntStatusD               1   1276.5 1318.5
## <none>                         1274.7 1318.7
## - IntStatusX               1   1276.9 1318.9
## - TotalFeesBilled          1   1277.7 1319.7
## - DisplayMinPay            1   1280.0 1322.0
## - Bscore                   1   1280.4 1322.4
## - QuarterlyCreditScore     1   1280.8 1322.8
## - DaysDeliq                1   1281.6 1323.6
## - OverlimitAmount          1   1282.5 1324.5
## - CreditLimit              1   1310.6 1352.6
## 
## Step:  AIC=1316.75
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusC            1   1274.8 1314.8
## - IntStatusO            1   1274.8 1314.8
## - BillLateCharge        1   1274.9 1314.9
## - ExtStatusE            1   1275.0 1315.0
## - ExtStatusF            1   1275.3 1315.3
## - IntStatusN            1   1275.6 1315.6
## - ExtStatusI            1   1276.3 1316.3
## - IntStatusD            1   1276.5 1316.5
## <none>                      1274.8 1316.8
## - Concessions           1   1276.8 1316.8
## - TotalNetPayments      1   1276.8 1316.8
## - IntStatusX            1   1276.9 1316.9
## - OpeningBalance        1   1277.6 1317.6
## - TotalFeesBilled       1   1278.2 1318.2
## - DisplayMinPay         1   1280.0 1320.0
## - Bscore                1   1280.4 1320.4
## - QuarterlyCreditScore  1   1280.9 1320.9
## - DaysDeliq             1   1281.6 1321.6
## - OverlimitAmount       1   1282.5 1322.5
## - EndingBalance         1   1286.8 1326.8
## - CreditLimit           1   1310.7 1350.7
## 
## Step:  AIC=1314.8
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusO + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + BillLateCharge + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusO            1   1274.9 1312.9
## - BillLateCharge        1   1275.0 1313.0
## - ExtStatusE            1   1275.0 1313.0
## - ExtStatusF            1   1275.4 1313.4
## - IntStatusN            1   1275.6 1313.6
## - ExtStatusI            1   1276.3 1314.3
## - IntStatusD            1   1276.6 1314.6
## <none>                      1274.8 1314.8
## - TotalNetPayments      1   1276.9 1314.9
## - Concessions           1   1276.9 1314.9
## - IntStatusX            1   1277.0 1315.0
## - OpeningBalance        1   1277.6 1315.6
## - TotalFeesBilled       1   1278.3 1316.3
## - DisplayMinPay         1   1280.1 1318.1
## - Bscore                1   1280.4 1318.4
## - QuarterlyCreditScore  1   1281.0 1319.0
## - DaysDeliq             1   1281.7 1319.7
## - OverlimitAmount       1   1282.5 1320.5
## - EndingBalance         1   1287.1 1325.1
## - CreditLimit           1   1311.6 1349.6
## 
## Step:  AIC=1312.9
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## - BillLateCharge        1   1275.1 1311.1
## - ExtStatusE            1   1275.1 1311.1
## - ExtStatusF            1   1275.4 1311.4
## - IntStatusN            1   1275.7 1311.7
## - ExtStatusI            1   1276.4 1312.4
## - IntStatusD            1   1276.8 1312.8
## <none>                      1274.9 1312.9
## - TotalNetPayments      1   1276.9 1312.9
## - IntStatusX            1   1277.0 1313.0
## - Concessions           1   1277.0 1313.0
## - OpeningBalance        1   1277.8 1313.8
## - TotalFeesBilled       1   1278.5 1314.5
## - DisplayMinPay         1   1280.1 1316.1
## - Bscore                1   1280.4 1316.4
## - QuarterlyCreditScore  1   1281.1 1317.1
## - DaysDeliq             1   1282.0 1318.0
## - OverlimitAmount       1   1282.5 1318.5
## - EndingBalance         1   1287.8 1323.8
## - CreditLimit           1   1312.8 1348.8
## 
## Step:  AIC=1311.09
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusE            1   1275.3 1309.3
## - ExtStatusF            1   1275.6 1309.6
## - IntStatusN            1   1275.9 1309.9
## - ExtStatusI            1   1276.6 1310.6
## - IntStatusD            1   1276.8 1310.8
## - IntStatusX            1   1277.0 1311.0
## <none>                      1275.1 1311.1
## - TotalNetPayments      1   1277.1 1311.1
## - Concessions           1   1277.2 1311.2
## - OpeningBalance        1   1278.0 1312.0
## - DisplayMinPay         1   1280.1 1314.1
## - Bscore                1   1280.5 1314.5
## - QuarterlyCreditScore  1   1281.3 1315.3
## - DaysDeliq             1   1282.4 1316.4
## - OverlimitAmount       1   1282.6 1316.6
## - TotalFeesBilled       1   1286.1 1320.1
## - EndingBalance         1   1287.8 1321.8
## - CreditLimit           1   1313.4 1347.4
## 
## Step:  AIC=1309.35
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusF            1   1275.9 1307.9
## - IntStatusN            1   1276.2 1308.2
## - ExtStatusI            1   1276.9 1308.9
## - IntStatusD            1   1277.1 1309.1
## - IntStatusX            1   1277.3 1309.3
## - TotalNetPayments      1   1277.3 1309.3
## <none>                      1275.3 1309.3
## - Concessions           1   1277.4 1309.4
## - OpeningBalance        1   1278.2 1310.2
## - DisplayMinPay         1   1280.4 1312.4
## - Bscore                1   1280.7 1312.7
## - QuarterlyCreditScore  1   1281.7 1313.7
## - DaysDeliq             1   1282.7 1314.7
## - OverlimitAmount       1   1282.9 1314.9
## - TotalFeesBilled       1   1286.5 1318.5
## - EndingBalance         1   1288.1 1320.1
## - CreditLimit           1   1313.8 1345.8
## 
## Step:  AIC=1307.86
## .outcome ~ ExtStatusI + IntStatusD + IntStatusN + IntStatusX + 
##     DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusN            1   1276.7 1306.7
## - ExtStatusI            1   1277.4 1307.4
## - IntStatusD            1   1277.4 1307.4
## - IntStatusX            1   1277.7 1307.7
## - TotalNetPayments      1   1277.8 1307.8
## <none>                      1275.9 1307.9
## - Concessions           1   1278.1 1308.1
## - OpeningBalance        1   1279.0 1309.0
## - Bscore                1   1280.9 1310.9
## - DisplayMinPay         1   1281.0 1311.0
## - QuarterlyCreditScore  1   1282.4 1312.4
## - DaysDeliq             1   1283.4 1313.4
## - OverlimitAmount       1   1283.6 1313.6
## - TotalFeesBilled       1   1286.7 1316.7
## - EndingBalance         1   1289.1 1319.1
## - CreditLimit           1   1316.2 1346.2
## 
## Step:  AIC=1306.7
## .outcome ~ ExtStatusI + IntStatusD + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusI            1   1278.2 1306.2
## - IntStatusD            1   1278.3 1306.3
## - IntStatusX            1   1278.5 1306.5
## <none>                      1276.7 1306.7
## - TotalNetPayments      1   1278.7 1306.7
## - Concessions           1   1279.0 1307.0
## - OpeningBalance        1   1279.8 1307.8
## - DisplayMinPay         1   1281.6 1309.6
## - Bscore                1   1281.8 1309.8
## - QuarterlyCreditScore  1   1283.3 1311.3
## - OverlimitAmount       1   1284.1 1312.1
## - DaysDeliq             1   1284.1 1312.1
## - TotalFeesBilled       1   1287.6 1315.6
## - EndingBalance         1   1290.6 1318.6
## - CreditLimit           1   1318.5 1346.5
## 
## Step:  AIC=1306.25
## .outcome ~ IntStatusD + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## - IntStatusD            1   1279.7 1305.7
## - IntStatusX            1   1279.8 1305.8
## - TotalNetPayments      1   1280.2 1306.2
## <none>                      1278.2 1306.2
## - Concessions           1   1280.6 1306.6
## - OpeningBalance        1   1281.5 1307.5
## - DisplayMinPay         1   1283.2 1309.2
## - Bscore                1   1283.6 1309.6
## - QuarterlyCreditScore  1   1284.8 1310.8
## - OverlimitAmount       1   1285.6 1311.6
## - DaysDeliq             1   1285.6 1311.6
## - TotalFeesBilled       1   1288.5 1314.5
## - EndingBalance         1   1292.1 1318.1
## - CreditLimit           1   1319.9 1345.9
## 
## Step:  AIC=1305.74
## .outcome ~ IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusX            1   1280.1 1304.1
## <none>                      1279.7 1305.7
## - Concessions           1   1282.0 1306.0
## - TotalNetPayments      1   1282.0 1306.0
## - OpeningBalance        1   1283.3 1307.3
## - DisplayMinPay         1   1284.7 1308.7
## - DaysDeliq             1   1285.7 1309.7
## - QuarterlyCreditScore  1   1286.4 1310.4
## - Bscore                1   1287.1 1311.1
## - OverlimitAmount       1   1288.4 1312.4
## - TotalFeesBilled       1   1288.8 1312.8
## - EndingBalance         1   1293.2 1317.2
## - CreditLimit           1   1321.4 1345.4
## 
## Step:  AIC=1304.08
## .outcome ~ DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## <none>                      1280.1 1304.1
## - Concessions           1   1282.3 1304.3
## - TotalNetPayments      1   1282.3 1304.3
## - OpeningBalance        1   1283.6 1305.6
## - DisplayMinPay         1   1284.8 1306.8
## - DaysDeliq             1   1286.0 1308.0
## - QuarterlyCreditScore  1   1286.8 1308.8
## - OverlimitAmount       1   1288.4 1310.4
## - TotalFeesBilled       1   1288.8 1310.8
## - Bscore                1   1290.2 1312.2
## - EndingBalance         1   1293.3 1315.3
## - CreditLimit           1   1322.8 1344.8
## Start:  AIC=1316.6
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     ExtStatusZ + IntStatusD + IntStatusN + IntStatusO + IntStatusX + 
##     DaysDeliq + ActualMinPay + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
## 
## Step:  AIC=1316.6
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     ActualMinPay + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     BillLateCharge + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ActualMinPay             1   1270.6 1314.6
## - TotalNetPurchaseAndCash  1   1270.6 1314.6
## - DisplayMinPay            1   1270.6 1314.6
## - ExtStatusC               1   1270.6 1314.6
## - OverlimitAmount          1   1270.7 1314.7
## - TotalNetPayments         1   1270.7 1314.7
## - BillLateCharge           1   1270.7 1314.7
## - IntStatusO               1   1270.8 1314.8
## - ExtStatusE               1   1270.8 1314.8
## - OpeningBalance           1   1270.9 1314.9
## - IntStatusN               1   1271.2 1315.2
## - EndingBalance            1   1271.5 1315.5
## - IntStatusD               1   1271.9 1315.9
## - ExtStatusI               1   1272.2 1316.2
## <none>                         1270.6 1316.6
## - Concessions              1   1272.6 1316.6
## - ExtStatusF               1   1272.7 1316.7
## - QuarterlyCreditScore     1   1274.3 1318.3
## - IntStatusX               1   1274.4 1318.4
## - TotalFeesBilled          1   1274.5 1318.5
## - Bscore                   1   1277.0 1321.0
## - DaysDeliq                1   1277.3 1321.3
## - CreditLimit              1   1308.2 1352.2
## 
## Step:  AIC=1314.6
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - TotalNetPurchaseAndCash  1   1270.6 1312.6
## - ExtStatusC               1   1270.6 1312.6
## - TotalNetPayments         1   1270.7 1312.7
## - BillLateCharge           1   1270.7 1312.7
## - IntStatusO               1   1270.8 1312.8
## - ExtStatusE               1   1270.8 1312.8
## - OpeningBalance           1   1270.9 1312.9
## - IntStatusN               1   1271.2 1313.2
## - EndingBalance            1   1271.5 1313.5
## - IntStatusD               1   1271.9 1313.9
## - ExtStatusI               1   1272.2 1314.2
## <none>                         1270.6 1314.6
## - Concessions              1   1272.6 1314.6
## - ExtStatusF               1   1272.7 1314.7
## - QuarterlyCreditScore     1   1274.3 1316.3
## - IntStatusX               1   1274.4 1316.4
## - TotalFeesBilled          1   1274.5 1316.5
## - DisplayMinPay            1   1275.7 1317.7
## - Bscore                   1   1277.0 1319.0
## - DaysDeliq                1   1277.3 1319.3
## - OverlimitAmount          1   1278.9 1320.9
## - CreditLimit              1   1308.2 1350.2
## 
## Step:  AIC=1312.6
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusC            1   1270.6 1310.6
## - BillLateCharge        1   1270.7 1310.7
## - IntStatusO            1   1270.8 1310.8
## - ExtStatusE            1   1270.9 1310.9
## - IntStatusN            1   1271.2 1311.2
## - IntStatusD            1   1271.9 1311.9
## - TotalNetPayments      1   1272.0 1312.0
## - ExtStatusI            1   1272.2 1312.2
## <none>                      1270.6 1312.6
## - ExtStatusF            1   1272.7 1312.7
## - Concessions           1   1273.1 1313.1
## - QuarterlyCreditScore  1   1274.3 1314.3
## - IntStatusX            1   1274.4 1314.4
## - TotalFeesBilled       1   1275.5 1315.5
## - DisplayMinPay         1   1275.7 1315.7
## - OpeningBalance        1   1276.0 1316.0
## - Bscore                1   1277.0 1317.0
## - DaysDeliq             1   1277.3 1317.3
## - OverlimitAmount       1   1279.0 1319.0
## - EndingBalance         1   1280.2 1320.2
## - CreditLimit           1   1308.3 1348.3
## 
## Step:  AIC=1310.64
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusO + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + BillLateCharge + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - BillLateCharge        1   1270.8 1308.8
## - IntStatusO            1   1270.8 1308.8
## - ExtStatusE            1   1270.9 1308.9
## - IntStatusN            1   1271.3 1309.3
## - IntStatusD            1   1272.0 1310.0
## - TotalNetPayments      1   1272.1 1310.1
## - ExtStatusI            1   1272.3 1310.3
## <none>                      1270.6 1310.6
## - ExtStatusF            1   1272.8 1310.8
## - Concessions           1   1273.1 1311.1
## - QuarterlyCreditScore  1   1274.3 1312.3
## - IntStatusX            1   1274.5 1312.5
## - TotalFeesBilled       1   1275.5 1313.5
## - DisplayMinPay         1   1275.7 1313.7
## - OpeningBalance        1   1276.1 1314.1
## - Bscore                1   1277.2 1315.2
## - DaysDeliq             1   1277.3 1315.3
## - OverlimitAmount       1   1279.2 1317.2
## - EndingBalance         1   1280.2 1318.2
## - CreditLimit           1   1308.7 1346.7
## 
## Step:  AIC=1308.77
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusO + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## - IntStatusO            1   1271.0 1307.0
## - ExtStatusE            1   1271.0 1307.0
## - IntStatusN            1   1271.4 1307.4
## - IntStatusD            1   1272.0 1308.0
## - TotalNetPayments      1   1272.2 1308.2
## - ExtStatusI            1   1272.4 1308.4
## <none>                      1270.8 1308.8
## - ExtStatusF            1   1272.9 1308.9
## - Concessions           1   1273.2 1309.2
## - QuarterlyCreditScore  1   1274.4 1310.4
## - IntStatusX            1   1274.5 1310.5
## - DisplayMinPay         1   1275.8 1311.8
## - OpeningBalance        1   1276.2 1312.2
## - Bscore                1   1277.2 1313.2
## - DaysDeliq             1   1277.6 1313.6
## - OverlimitAmount       1   1279.2 1315.2
## - EndingBalance         1   1280.2 1316.2
## - TotalFeesBilled       1   1284.3 1320.3
## - CreditLimit           1   1309.3 1345.3
## 
## Step:  AIC=1306.95
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusE            1   1271.2 1305.2
## - IntStatusN            1   1271.6 1305.6
## - IntStatusD            1   1272.3 1306.3
## - TotalNetPayments      1   1272.3 1306.3
## - ExtStatusI            1   1272.6 1306.6
## <none>                      1271.0 1307.0
## - ExtStatusF            1   1273.0 1307.0
## - Concessions           1   1273.4 1307.4
## - IntStatusX            1   1274.5 1308.5
## - QuarterlyCreditScore  1   1274.6 1308.6
## - DisplayMinPay         1   1275.8 1309.8
## - OpeningBalance        1   1276.5 1310.5
## - Bscore                1   1277.2 1311.2
## - DaysDeliq             1   1278.1 1312.1
## - OverlimitAmount       1   1279.2 1313.2
## - EndingBalance         1   1280.6 1314.6
## - TotalFeesBilled       1   1284.7 1318.7
## - CreditLimit           1   1310.1 1344.1
## 
## Step:  AIC=1305.22
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusN            1   1271.9 1303.9
## - TotalNetPayments      1   1272.6 1304.6
## - IntStatusD            1   1272.6 1304.6
## - ExtStatusI            1   1272.8 1304.8
## <none>                      1271.2 1305.2
## - ExtStatusF            1   1273.3 1305.3
## - Concessions           1   1273.7 1305.7
## - IntStatusX            1   1274.8 1306.8
## - QuarterlyCreditScore  1   1275.1 1307.1
## - DisplayMinPay         1   1276.1 1308.1
## - OpeningBalance        1   1276.9 1308.9
## - Bscore                1   1277.4 1309.4
## - DaysDeliq             1   1278.5 1310.5
## - OverlimitAmount       1   1279.5 1311.5
## - EndingBalance         1   1280.8 1312.8
## - TotalFeesBilled       1   1285.0 1317.0
## - CreditLimit           1   1310.5 1342.5
## 
## Step:  AIC=1303.88
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusX + 
##     DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusD            1   1273.2 1303.2
## - TotalNetPayments      1   1273.3 1303.3
## - ExtStatusI            1   1273.5 1303.5
## <none>                      1271.9 1303.9
## - ExtStatusF            1   1274.0 1304.0
## - Concessions           1   1274.4 1304.4
## - IntStatusX            1   1275.5 1305.5
## - QuarterlyCreditScore  1   1275.8 1305.8
## - DisplayMinPay         1   1276.5 1306.5
## - OpeningBalance        1   1277.5 1307.5
## - Bscore                1   1278.1 1308.1
## - DaysDeliq             1   1279.0 1309.0
## - OverlimitAmount       1   1279.9 1309.9
## - EndingBalance         1   1281.9 1311.9
## - TotalFeesBilled       1   1285.7 1315.7
## - CreditLimit           1   1312.3 1342.3
## 
## Step:  AIC=1303.25
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusI            1   1274.8 1302.8
## - TotalNetPayments      1   1274.8 1302.8
## - ExtStatusF            1   1274.9 1302.9
## <none>                      1273.2 1303.2
## - IntStatusX            1   1275.5 1303.5
## - Concessions           1   1275.7 1303.7
## - QuarterlyCreditScore  1   1277.2 1305.2
## - DisplayMinPay         1   1277.9 1305.9
## - DaysDeliq             1   1279.2 1307.2
## - OpeningBalance        1   1279.4 1307.4
## - Bscore                1   1280.6 1308.6
## - OverlimitAmount       1   1282.5 1310.5
## - EndingBalance         1   1282.8 1310.8
## - TotalFeesBilled       1   1285.9 1313.9
## - CreditLimit           1   1313.3 1341.3
## 
## Step:  AIC=1302.81
## .outcome ~ ExtStatusF + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## - TotalNetPayments      1   1276.4 1302.4
## - ExtStatusF            1   1276.5 1302.5
## - IntStatusX            1   1276.8 1302.8
## <none>                      1274.8 1302.8
## - Concessions           1   1277.2 1303.2
## - QuarterlyCreditScore  1   1278.7 1304.7
## - DisplayMinPay         1   1279.5 1305.5
## - DaysDeliq             1   1280.8 1306.8
## - OpeningBalance        1   1281.1 1307.1
## - Bscore                1   1282.5 1308.5
## - OverlimitAmount       1   1284.0 1310.0
## - EndingBalance         1   1284.3 1310.3
## - TotalFeesBilled       1   1286.7 1312.7
## - CreditLimit           1   1314.7 1340.7
## 
## Step:  AIC=1302.36
## .outcome ~ ExtStatusF + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + EndingBalance + CreditLimit + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusF            1   1277.9 1301.9
## - IntStatusX            1   1278.3 1302.3
## <none>                      1276.4 1302.4
## - Concessions           1   1279.8 1303.8
## - QuarterlyCreditScore  1   1280.7 1304.7
## - DisplayMinPay         1   1281.2 1305.2
## - DaysDeliq             1   1282.0 1306.0
## - Bscore                1   1284.1 1308.1
## - EndingBalance         1   1284.4 1308.4
## - OverlimitAmount       1   1286.1 1310.1
## - OpeningBalance        1   1286.4 1310.4
## - TotalFeesBilled       1   1287.6 1311.6
## - CreditLimit           1   1315.1 1339.1
## 
## Step:  AIC=1301.94
## .outcome ~ IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusX            1   1279.8 1301.8
## <none>                      1277.9 1301.9
## - Concessions           1   1281.8 1303.8
## - QuarterlyCreditScore  1   1282.4 1304.4
## - DisplayMinPay         1   1283.0 1305.0
## - Bscore                1   1284.2 1306.2
## - DaysDeliq             1   1284.6 1306.6
## - EndingBalance         1   1287.2 1309.2
## - OverlimitAmount       1   1288.0 1310.0
## - OpeningBalance        1   1288.8 1310.8
## - TotalFeesBilled       1   1288.9 1310.9
## - CreditLimit           1   1321.0 1343.0
## 
## Step:  AIC=1301.8
## .outcome ~ DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## <none>                      1279.8 1301.8
## - Concessions           1   1283.6 1303.6
## - DisplayMinPay         1   1284.2 1304.2
## - QuarterlyCreditScore  1   1284.2 1304.2
## - DaysDeliq             1   1284.7 1304.7
## - EndingBalance         1   1287.6 1307.6
## - OverlimitAmount       1   1288.5 1308.5
## - TotalFeesBilled       1   1289.6 1309.6
## - Bscore                1   1290.4 1310.4
## - OpeningBalance        1   1290.6 1310.6
## - CreditLimit           1   1321.1 1341.1
## Start:  AIC=1286.36
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     ExtStatusZ + IntStatusD + IntStatusN + IntStatusO + IntStatusX + 
##     DaysDeliq + ActualMinPay + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
## 
## Step:  AIC=1286.36
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     ActualMinPay + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     BillLateCharge + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
## 
## Step:  AIC=1286.36
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + IntStatusD + 
##     IntStatusN + IntStatusO + IntStatusX + DaysDeliq + ActualMinPay + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ActualMinPay             1   1242.4 1284.4
## - ExtStatusE               1   1242.4 1284.4
## - DisplayMinPay            1   1242.4 1284.4
## - TotalNetPayments         1   1242.4 1284.4
## - TotalNetPurchaseAndCash  1   1242.4 1284.4
## - ExtStatusC               1   1242.4 1284.4
## - OverlimitAmount          1   1242.4 1284.4
## - OpeningBalance           1   1242.6 1284.6
## - BillLateCharge           1   1242.7 1284.7
## - ExtStatusF               1   1242.8 1284.8
## - IntStatusN               1   1243.0 1285.0
## - EndingBalance            1   1243.1 1285.1
## - IntStatusO               1   1243.4 1285.4
## - IntStatusD               1   1243.8 1285.8
## <none>                         1242.4 1286.4
## - IntStatusX               1   1244.6 1286.6
## - Concessions              1   1244.8 1286.8
## - TotalFeesBilled          1   1245.7 1287.7
## - DaysDeliq                1   1246.0 1288.0
## - QuarterlyCreditScore     1   1248.8 1290.8
## - Bscore                   1   1253.9 1295.9
## - CreditLimit              1   1270.1 1312.1
## 
## Step:  AIC=1284.36
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + IntStatusD + 
##     IntStatusN + IntStatusO + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + BillLateCharge + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ExtStatusE               1   1242.4 1282.4
## - TotalNetPayments         1   1242.4 1282.4
## - TotalNetPurchaseAndCash  1   1242.4 1282.4
## - ExtStatusC               1   1242.4 1282.4
## - OpeningBalance           1   1242.6 1282.6
## - BillLateCharge           1   1242.7 1282.7
## - ExtStatusF               1   1242.8 1282.8
## - IntStatusN               1   1243.0 1283.0
## - EndingBalance            1   1243.1 1283.1
## - IntStatusO               1   1243.4 1283.4
## - IntStatusD               1   1243.8 1283.8
## <none>                         1242.4 1284.4
## - IntStatusX               1   1244.6 1284.6
## - Concessions              1   1244.8 1284.8
## - TotalFeesBilled          1   1245.7 1285.7
## - DaysDeliq                1   1246.0 1286.0
## - DisplayMinPay            1   1247.3 1287.3
## - QuarterlyCreditScore     1   1248.8 1288.8
## - OverlimitAmount          1   1249.7 1289.7
## - Bscore                   1   1253.9 1293.9
## - CreditLimit              1   1270.1 1310.1
## 
## Step:  AIC=1282.37
## .outcome ~ ExtStatusC + ExtStatusF + IntStatusD + IntStatusN + 
##     IntStatusO + IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - TotalNetPayments         1   1242.4 1280.4
## - TotalNetPurchaseAndCash  1   1242.4 1280.4
## - ExtStatusC               1   1242.4 1280.4
## - OpeningBalance           1   1242.6 1280.6
## - BillLateCharge           1   1242.7 1280.7
## - ExtStatusF               1   1242.8 1280.8
## - IntStatusN               1   1243.0 1281.0
## - EndingBalance            1   1243.1 1281.1
## - IntStatusO               1   1243.4 1281.4
## - IntStatusD               1   1243.8 1281.8
## <none>                         1242.4 1282.4
## - IntStatusX               1   1244.6 1282.6
## - Concessions              1   1244.8 1282.8
## - TotalFeesBilled          1   1245.7 1283.7
## - DaysDeliq                1   1246.0 1284.0
## - DisplayMinPay            1   1247.3 1285.3
## - QuarterlyCreditScore     1   1248.9 1286.9
## - OverlimitAmount          1   1249.7 1287.7
## - Bscore                   1   1253.9 1291.9
## - CreditLimit              1   1270.1 1308.1
## 
## Step:  AIC=1280.38
## .outcome ~ ExtStatusC + ExtStatusF + IntStatusD + IntStatusN + 
##     IntStatusO + IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ExtStatusC               1   1242.4 1278.4
## - BillLateCharge           1   1242.7 1278.7
## - ExtStatusF               1   1242.8 1278.8
## - IntStatusN               1   1243.1 1279.1
## - IntStatusO               1   1243.4 1279.4
## - IntStatusD               1   1243.8 1279.8
## - TotalNetPurchaseAndCash  1   1244.3 1280.3
## <none>                         1242.4 1280.4
## - IntStatusX               1   1244.6 1280.6
## - Concessions              1   1245.1 1281.1
## - DaysDeliq                1   1246.0 1282.0
## - TotalFeesBilled          1   1246.8 1282.8
## - DisplayMinPay            1   1247.4 1283.4
## - OpeningBalance           1   1247.5 1283.5
## - QuarterlyCreditScore     1   1248.9 1284.9
## - EndingBalance            1   1249.5 1285.5
## - OverlimitAmount          1   1249.9 1285.9
## - Bscore                   1   1253.9 1289.9
## - CreditLimit              1   1270.3 1306.3
## 
## Step:  AIC=1278.42
## .outcome ~ ExtStatusF + IntStatusD + IntStatusN + IntStatusO + 
##     IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - BillLateCharge           1   1242.8 1276.8
## - ExtStatusF               1   1242.8 1276.8
## - IntStatusN               1   1243.1 1277.1
## - IntStatusO               1   1243.4 1277.4
## - IntStatusD               1   1243.8 1277.8
## - TotalNetPurchaseAndCash  1   1244.3 1278.3
## <none>                         1242.4 1278.4
## - IntStatusX               1   1244.7 1278.7
## - Concessions              1   1245.1 1279.1
## - DaysDeliq                1   1246.1 1280.1
## - TotalFeesBilled          1   1246.8 1280.8
## - DisplayMinPay            1   1247.4 1281.4
## - OpeningBalance           1   1247.5 1281.5
## - QuarterlyCreditScore     1   1249.0 1283.0
## - EndingBalance            1   1249.5 1283.5
## - OverlimitAmount          1   1250.1 1284.1
## - Bscore                   1   1254.2 1288.2
## - CreditLimit              1   1270.5 1304.5
## 
## Step:  AIC=1276.75
## .outcome ~ ExtStatusF + IntStatusD + IntStatusN + IntStatusO + 
##     IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ExtStatusF               1   1243.2 1275.2
## - IntStatusN               1   1243.4 1275.4
## - IntStatusO               1   1243.7 1275.7
## - IntStatusD               1   1244.0 1276.0
## - TotalNetPurchaseAndCash  1   1244.7 1276.7
## - IntStatusX               1   1244.7 1276.7
## <none>                         1242.8 1276.8
## - Concessions              1   1245.4 1277.4
## - DaysDeliq                1   1246.6 1278.6
## - DisplayMinPay            1   1247.6 1279.6
## - OpeningBalance           1   1247.8 1279.8
## - QuarterlyCreditScore     1   1249.3 1281.3
## - EndingBalance            1   1249.5 1281.5
## - OverlimitAmount          1   1250.3 1282.3
## - Bscore                   1   1254.3 1286.3
## - TotalFeesBilled          1   1256.7 1288.7
## - CreditLimit              1   1271.1 1303.1
## 
## Step:  AIC=1275.16
## .outcome ~ IntStatusD + IntStatusN + IntStatusO + IntStatusX + 
##     DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - IntStatusN               1   1243.8 1273.8
## - IntStatusO               1   1244.1 1274.1
## - IntStatusD               1   1244.3 1274.3
## - TotalNetPurchaseAndCash  1   1245.0 1275.0
## - IntStatusX               1   1245.1 1275.1
## <none>                         1243.2 1275.2
## - Concessions              1   1246.0 1276.0
## - DaysDeliq                1   1247.1 1277.1
## - DisplayMinPay            1   1248.0 1278.0
## - OpeningBalance           1   1248.2 1278.2
## - QuarterlyCreditScore     1   1249.9 1279.9
## - EndingBalance            1   1250.2 1280.2
## - OverlimitAmount          1   1250.8 1280.8
## - Bscore                   1   1255.1 1285.1
## - TotalFeesBilled          1   1256.8 1286.8
## - CreditLimit              1   1272.0 1302.0
## 
## Step:  AIC=1273.84
## .outcome ~ IntStatusD + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + EndingBalance + 
##     CreditLimit + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - IntStatusO               1   1244.8 1272.8
## - IntStatusD               1   1245.0 1273.0
## - IntStatusX               1   1245.8 1273.8
## - TotalNetPurchaseAndCash  1   1245.8 1273.8
## <none>                         1243.8 1273.8
## - Concessions              1   1246.7 1274.7
## - DaysDeliq                1   1247.6 1275.6
## - DisplayMinPay            1   1248.5 1276.5
## - OpeningBalance           1   1248.9 1276.9
## - QuarterlyCreditScore     1   1250.6 1278.6
## - EndingBalance            1   1251.1 1279.1
## - OverlimitAmount          1   1251.2 1279.2
## - Bscore                   1   1256.0 1284.0
## - TotalFeesBilled          1   1257.5 1285.5
## - CreditLimit              1   1273.5 1301.5
## 
## Step:  AIC=1272.81
## .outcome ~ IntStatusD + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + EndingBalance + CreditLimit + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - IntStatusD               1   1246.2 1272.2
## - IntStatusX               1   1246.5 1272.5
## - TotalNetPurchaseAndCash  1   1246.5 1272.5
## <none>                         1244.8 1272.8
## - Concessions              1   1247.8 1273.8
## - DisplayMinPay            1   1249.0 1275.0
## - DaysDeliq                1   1249.2 1275.2
## - OpeningBalance           1   1249.9 1275.9
## - EndingBalance            1   1251.2 1277.2
## - OverlimitAmount          1   1251.4 1277.4
## - QuarterlyCreditScore     1   1251.8 1277.8
## - Bscore                   1   1256.0 1282.0
## - TotalFeesBilled          1   1258.6 1284.6
## - CreditLimit              1   1273.5 1299.5
## 
## Step:  AIC=1272.24
## .outcome ~ IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - IntStatusX               1   1246.7 1270.7
## - TotalNetPurchaseAndCash  1   1248.2 1272.2
## <none>                         1246.2 1272.2
## - Concessions              1   1249.2 1273.2
## - DaysDeliq                1   1249.2 1273.2
## - DisplayMinPay            1   1250.3 1274.3
## - EndingBalance            1   1252.0 1276.0
## - OpeningBalance           1   1252.3 1276.3
## - QuarterlyCreditScore     1   1253.4 1277.4
## - OverlimitAmount          1   1253.8 1277.8
## - TotalFeesBilled          1   1258.8 1282.8
## - Bscore                   1   1261.0 1285.0
## - CreditLimit              1   1275.1 1299.1
## 
## Step:  AIC=1270.65
## .outcome ~ DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - TotalNetPurchaseAndCash  1   1248.6 1270.6
## <none>                         1246.7 1270.7
## - DaysDeliq                1   1249.2 1271.2
## - Concessions              1   1249.5 1271.5
## - DisplayMinPay            1   1250.4 1272.4
## - EndingBalance            1   1252.0 1274.0
## - OpeningBalance           1   1252.7 1274.7
## - QuarterlyCreditScore     1   1253.8 1275.8
## - OverlimitAmount          1   1253.9 1275.9
## - TotalFeesBilled          1   1258.8 1280.8
## - Bscore                   1   1265.6 1287.6
## - CreditLimit              1   1275.4 1297.4
## 
## Step:  AIC=1270.59
## .outcome ~ DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## <none>                      1248.6 1270.6
## - DaysDeliq             1   1250.8 1270.8
## - DisplayMinPay         1   1252.4 1272.4
## - OpeningBalance        1   1252.7 1272.7
## - Concessions           1   1253.5 1273.5
## - OverlimitAmount       1   1256.0 1276.0
## - QuarterlyCreditScore  1   1256.2 1276.2
## - EndingBalance         1   1256.6 1276.6
## - TotalFeesBilled       1   1259.0 1279.0
## - Bscore                1   1268.1 1288.1
## - CreditLimit           1   1275.4 1295.4
## Start:  AIC=1310.27
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     ExtStatusZ + IntStatusD + IntStatusN + IntStatusO + IntStatusX + 
##     DaysDeliq + ActualMinPay + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
## 
## Step:  AIC=1310.27
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     ActualMinPay + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     BillLateCharge + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ActualMinPay             1   1264.3 1308.3
## - BillLateCharge           1   1264.3 1308.3
## - IntStatusO               1   1264.3 1308.3
## - DisplayMinPay            1   1264.3 1308.3
## - EndingBalance            1   1264.3 1308.3
## - OverlimitAmount          1   1264.4 1308.4
## - ExtStatusC               1   1264.4 1308.4
## - ExtStatusE               1   1264.5 1308.5
## - TotalNetPayments         1   1264.6 1308.6
## - IntStatusN               1   1265.0 1309.0
## - ExtStatusF               1   1265.0 1309.0
## - TotalNetPurchaseAndCash  1   1265.2 1309.2
## - IntStatusD               1   1265.3 1309.3
## - ExtStatusI               1   1265.8 1309.8
## - Concessions              1   1265.9 1309.9
## - OpeningBalance           1   1266.0 1310.0
## - IntStatusX               1   1266.1 1310.1
## <none>                         1264.3 1310.3
## - TotalFeesBilled          1   1270.2 1314.2
## - Bscore                   1   1270.7 1314.7
## - DaysDeliq                1   1271.1 1315.1
## - QuarterlyCreditScore     1   1271.5 1315.5
## - CreditLimit              1   1301.7 1345.7
## 
## Step:  AIC=1308.27
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - BillLateCharge           1   1264.3 1306.3
## - IntStatusO               1   1264.3 1306.3
## - EndingBalance            1   1264.3 1306.3
## - ExtStatusC               1   1264.4 1306.4
## - ExtStatusE               1   1264.5 1306.5
## - TotalNetPayments         1   1264.6 1306.6
## - IntStatusN               1   1265.0 1307.0
## - ExtStatusF               1   1265.0 1307.0
## - TotalNetPurchaseAndCash  1   1265.2 1307.2
## - IntStatusD               1   1265.3 1307.3
## - ExtStatusI               1   1265.8 1307.8
## - Concessions              1   1265.9 1307.9
## - OpeningBalance           1   1266.0 1308.0
## - IntStatusX               1   1266.1 1308.1
## <none>                         1264.3 1308.3
## - DisplayMinPay            1   1269.7 1311.7
## - TotalFeesBilled          1   1270.2 1312.2
## - Bscore                   1   1270.7 1312.7
## - DaysDeliq                1   1271.1 1313.1
## - QuarterlyCreditScore     1   1271.5 1313.5
## - OverlimitAmount          1   1271.8 1313.8
## - CreditLimit              1   1301.7 1343.7
## 
## Step:  AIC=1306.27
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - IntStatusO               1   1264.3 1304.3
## - EndingBalance            1   1264.3 1304.3
## - ExtStatusC               1   1264.4 1304.4
## - ExtStatusE               1   1264.5 1304.5
## - TotalNetPayments         1   1264.6 1304.6
## - IntStatusN               1   1265.0 1305.0
## - ExtStatusF               1   1265.0 1305.0
## - TotalNetPurchaseAndCash  1   1265.2 1305.2
## - IntStatusD               1   1265.3 1305.3
## - ExtStatusI               1   1265.8 1305.8
## - Concessions              1   1265.9 1305.9
## - OpeningBalance           1   1266.0 1306.0
## - IntStatusX               1   1266.2 1306.2
## <none>                         1264.3 1306.3
## - DisplayMinPay            1   1269.7 1309.7
## - Bscore                   1   1270.7 1310.7
## - DaysDeliq                1   1271.1 1311.1
## - QuarterlyCreditScore     1   1271.5 1311.5
## - OverlimitAmount          1   1271.8 1311.8
## - TotalFeesBilled          1   1274.9 1314.9
## - CreditLimit              1   1301.8 1341.8
## 
## Step:  AIC=1304.29
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - EndingBalance            1   1264.3 1302.3
## - ExtStatusC               1   1264.4 1302.4
## - ExtStatusE               1   1264.6 1302.6
## - TotalNetPayments         1   1264.7 1302.7
## - IntStatusN               1   1265.0 1303.0
## - ExtStatusF               1   1265.0 1303.0
## - TotalNetPurchaseAndCash  1   1265.3 1303.3
## - IntStatusD               1   1265.3 1303.3
## - ExtStatusI               1   1265.8 1303.8
## - Concessions              1   1266.0 1304.0
## - OpeningBalance           1   1266.0 1304.0
## <none>                         1264.3 1304.3
## - IntStatusX               1   1266.3 1304.3
## - DisplayMinPay            1   1270.0 1308.0
## - Bscore                   1   1271.1 1309.1
## - DaysDeliq                1   1271.1 1309.1
## - QuarterlyCreditScore     1   1271.5 1309.5
## - OverlimitAmount          1   1272.3 1310.3
## - TotalFeesBilled          1   1275.0 1313.0
## - CreditLimit              1   1304.2 1342.2
## 
## Step:  AIC=1302.35
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + CreditLimit + TotalNetPayments + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ExtStatusC               1   1264.5 1300.5
## - ExtStatusE               1   1264.6 1300.6
## - IntStatusN               1   1265.0 1301.0
## - ExtStatusF               1   1265.1 1301.1
## - IntStatusD               1   1265.4 1301.4
## - ExtStatusI               1   1265.9 1301.9
## - Concessions              1   1266.1 1302.1
## <none>                         1264.3 1302.3
## - IntStatusX               1   1266.4 1302.4
## - DisplayMinPay            1   1270.0 1306.0
## - DaysDeliq                1   1271.1 1307.1
## - Bscore                   1   1271.3 1307.3
## - QuarterlyCreditScore     1   1271.6 1307.6
## - OverlimitAmount          1   1272.6 1308.6
## - TotalNetPayments         1   1273.6 1309.6
## - TotalNetPurchaseAndCash  1   1280.8 1316.8
## - TotalFeesBilled          1   1282.3 1318.3
## - OpeningBalance           1   1294.3 1330.3
## - CreditLimit              1   1305.6 1341.6
## 
## Step:  AIC=1300.49
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ExtStatusE               1   1264.8 1298.8
## - IntStatusN               1   1265.2 1299.2
## - ExtStatusF               1   1265.3 1299.3
## - IntStatusD               1   1265.6 1299.6
## - ExtStatusI               1   1266.0 1300.0
## - Concessions              1   1266.2 1300.2
## <none>                         1264.5 1300.5
## - IntStatusX               1   1266.5 1300.5
## - DisplayMinPay            1   1270.2 1304.2
## - DaysDeliq                1   1271.3 1305.3
## - Bscore                   1   1271.6 1305.6
## - QuarterlyCreditScore     1   1271.7 1305.7
## - OverlimitAmount          1   1273.2 1307.2
## - TotalNetPayments         1   1273.6 1307.6
## - TotalNetPurchaseAndCash  1   1280.8 1314.8
## - TotalFeesBilled          1   1282.5 1316.5
## - OpeningBalance           1   1294.3 1328.3
## - CreditLimit              1   1305.8 1339.8
## 
## Step:  AIC=1298.75
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - IntStatusN               1   1265.4 1297.4
## - ExtStatusF               1   1265.5 1297.5
## - IntStatusD               1   1265.8 1297.8
## - ExtStatusI               1   1266.2 1298.2
## - Concessions              1   1266.5 1298.5
## <none>                         1264.8 1298.8
## - IntStatusX               1   1266.8 1298.8
## - DisplayMinPay            1   1270.5 1302.5
## - DaysDeliq                1   1271.7 1303.7
## - Bscore                   1   1271.8 1303.8
## - QuarterlyCreditScore     1   1272.2 1304.2
## - OverlimitAmount          1   1273.5 1305.5
## - TotalNetPayments         1   1273.9 1305.9
## - TotalNetPurchaseAndCash  1   1281.1 1313.1
## - TotalFeesBilled          1   1282.9 1314.9
## - OpeningBalance           1   1294.7 1326.7
## - CreditLimit              1   1306.2 1338.2
## 
## Step:  AIC=1297.42
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusX + 
##     DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ExtStatusF               1   1266.2 1296.2
## - IntStatusD               1   1266.5 1296.5
## - ExtStatusI               1   1266.9 1296.9
## - Concessions              1   1267.1 1297.1
## <none>                         1265.4 1297.4
## - IntStatusX               1   1267.5 1297.5
## - DisplayMinPay            1   1271.0 1301.0
## - DaysDeliq                1   1272.2 1302.2
## - Bscore                   1   1272.5 1302.5
## - QuarterlyCreditScore     1   1272.9 1302.9
## - OverlimitAmount          1   1273.9 1303.9
## - TotalNetPayments         1   1274.8 1304.8
## - TotalNetPurchaseAndCash  1   1282.3 1312.3
## - TotalFeesBilled          1   1283.7 1313.7
## - OpeningBalance           1   1296.0 1326.0
## - CreditLimit              1   1308.2 1338.2
## 
## Step:  AIC=1296.23
## .outcome ~ ExtStatusI + IntStatusD + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - IntStatusD               1   1267.1 1295.1
## - ExtStatusI               1   1267.8 1295.8
## - IntStatusX               1   1268.1 1296.1
## - Concessions              1   1268.1 1296.1
## <none>                         1266.2 1296.2
## - DisplayMinPay            1   1271.9 1299.9
## - Bscore                   1   1272.8 1300.8
## - DaysDeliq                1   1273.2 1301.2
## - QuarterlyCreditScore     1   1273.9 1301.9
## - OverlimitAmount          1   1275.0 1303.0
## - TotalNetPayments         1   1276.3 1304.3
## - TotalNetPurchaseAndCash  1   1283.8 1311.8
## - TotalFeesBilled          1   1284.2 1312.2
## - OpeningBalance           1   1298.8 1326.8
## - CreditLimit              1   1311.2 1339.2
## 
## Step:  AIC=1295.1
## .outcome ~ ExtStatusI + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + CreditLimit + TotalNetPayments + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - IntStatusX               1   1268.1 1294.1
## - ExtStatusI               1   1268.6 1294.6
## - Concessions              1   1268.9 1294.9
## <none>                         1267.1 1295.1
## - DisplayMinPay            1   1272.8 1298.8
## - DaysDeliq                1   1273.6 1299.6
## - QuarterlyCreditScore     1   1274.9 1300.9
## - Bscore                   1   1275.5 1301.5
## - TotalNetPayments         1   1276.5 1302.5
## - OverlimitAmount          1   1276.8 1302.8
## - TotalNetPurchaseAndCash  1   1284.2 1310.2
## - TotalFeesBilled          1   1284.2 1310.2
## - OpeningBalance           1   1299.5 1325.5
## - CreditLimit              1   1311.8 1337.8
## 
## Step:  AIC=1294.06
## .outcome ~ ExtStatusI + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ExtStatusI               1   1269.4 1293.4
## - Concessions              1   1269.9 1293.9
## <none>                         1268.1 1294.1
## - DisplayMinPay            1   1273.2 1297.2
## - DaysDeliq                1   1273.6 1297.6
## - QuarterlyCreditScore     1   1275.9 1299.9
## - TotalNetPayments         1   1276.6 1300.6
## - OverlimitAmount          1   1276.9 1300.9
## - Bscore                   1   1280.6 1304.6
## - TotalNetPurchaseAndCash  1   1284.2 1308.2
## - TotalFeesBilled          1   1284.2 1308.2
## - OpeningBalance           1   1299.7 1323.7
## - CreditLimit              1   1312.3 1336.3
## 
## Step:  AIC=1293.37
## .outcome ~ DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - Concessions              1   1271.2 1293.2
## <none>                         1269.4 1293.4
## - DisplayMinPay            1   1274.6 1296.6
## - DaysDeliq                1   1275.2 1297.2
## - QuarterlyCreditScore     1   1277.2 1299.2
## - TotalNetPayments         1   1278.1 1300.1
## - OverlimitAmount          1   1278.3 1300.3
## - Bscore                   1   1281.9 1303.9
## - TotalFeesBilled          1   1284.9 1306.9
## - TotalNetPurchaseAndCash  1   1285.7 1307.7
## - OpeningBalance           1   1301.5 1323.5
## - CreditLimit              1   1313.8 1335.8
## 
## Step:  AIC=1293.23
## .outcome ~ DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## <none>                         1271.2 1293.2
## - DisplayMinPay            1   1277.1 1297.1
## - DaysDeliq                1   1277.1 1297.1
## - TotalNetPayments         1   1278.8 1298.8
## - QuarterlyCreditScore     1   1278.8 1298.8
## - OverlimitAmount          1   1281.0 1301.0
## - Bscore                   1   1284.6 1304.6
## - TotalNetPurchaseAndCash  1   1287.7 1307.7
## - TotalFeesBilled          1   1288.1 1308.1
## - OpeningBalance           1   1304.2 1324.2
## - CreditLimit              1   1316.8 1336.8
## Start:  AIC=1327.69
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     ExtStatusZ + IntStatusD + IntStatusN + IntStatusO + IntStatusX + 
##     DaysDeliq + ActualMinPay + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
## 
## Step:  AIC=1327.69
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     ActualMinPay + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     BillLateCharge + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ActualMinPay             1   1281.7 1325.7
## - DisplayMinPay            1   1281.7 1325.7
## - OverlimitAmount          1   1281.7 1325.7
## - IntStatusO               1   1281.7 1325.7
## - ExtStatusC               1   1281.8 1325.8
## - ExtStatusE               1   1281.8 1325.8
## - OpeningBalance           1   1281.9 1325.9
## - BillLateCharge           1   1282.1 1326.1
## - TotalNetPurchaseAndCash  1   1282.2 1326.2
## - TotalNetPayments         1   1282.4 1326.4
## - IntStatusN               1   1282.6 1326.6
## - ExtStatusF               1   1283.0 1327.0
## - IntStatusD               1   1283.1 1327.1
## - ExtStatusI               1   1283.3 1327.3
## - TotalFeesBilled          1   1283.3 1327.3
## - EndingBalance            1   1283.5 1327.5
## <none>                         1281.7 1327.7
## - IntStatusX               1   1284.0 1328.0
## - Concessions              1   1285.2 1329.2
## - DaysDeliq                1   1287.7 1331.7
## - Bscore                   1   1287.8 1331.8
## - QuarterlyCreditScore     1   1288.5 1332.5
## - CreditLimit              1   1312.5 1356.5
## 
## Step:  AIC=1325.69
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - IntStatusO               1   1281.7 1323.7
## - ExtStatusC               1   1281.8 1323.8
## - ExtStatusE               1   1281.8 1323.8
## - OpeningBalance           1   1281.9 1323.9
## - BillLateCharge           1   1282.1 1324.1
## - TotalNetPurchaseAndCash  1   1282.2 1324.2
## - TotalNetPayments         1   1282.4 1324.4
## - IntStatusN               1   1282.6 1324.6
## - ExtStatusF               1   1283.0 1325.0
## - IntStatusD               1   1283.1 1325.1
## - ExtStatusI               1   1283.3 1325.3
## - TotalFeesBilled          1   1283.3 1325.3
## - EndingBalance            1   1283.5 1325.5
## <none>                         1281.7 1325.7
## - IntStatusX               1   1284.0 1326.0
## - Concessions              1   1285.2 1327.2
## - DisplayMinPay            1   1286.3 1328.3
## - DaysDeliq                1   1287.7 1329.7
## - Bscore                   1   1287.8 1329.8
## - OverlimitAmount          1   1288.5 1330.5
## - QuarterlyCreditScore     1   1288.5 1330.5
## - CreditLimit              1   1312.5 1354.5
## 
## Step:  AIC=1323.71
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + BillLateCharge + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ExtStatusC               1   1281.8 1321.8
## - ExtStatusE               1   1281.8 1321.8
## - OpeningBalance           1   1281.9 1321.9
## - BillLateCharge           1   1282.1 1322.1
## - TotalNetPurchaseAndCash  1   1282.2 1322.2
## - TotalNetPayments         1   1282.4 1322.4
## - IntStatusN               1   1282.6 1322.6
## - ExtStatusF               1   1283.0 1323.0
## - IntStatusD               1   1283.2 1323.2
## - ExtStatusI               1   1283.3 1323.3
## - TotalFeesBilled          1   1283.3 1323.3
## - EndingBalance            1   1283.5 1323.5
## <none>                         1281.7 1323.7
## - IntStatusX               1   1284.0 1324.0
## - Concessions              1   1285.2 1325.2
## - DisplayMinPay            1   1286.3 1326.3
## - DaysDeliq                1   1287.9 1327.9
## - Bscore                   1   1287.9 1327.9
## - QuarterlyCreditScore     1   1288.6 1328.6
## - OverlimitAmount          1   1288.7 1328.7
## - CreditLimit              1   1313.7 1353.7
## 
## Step:  AIC=1321.76
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ExtStatusE               1   1281.9 1319.9
## - OpeningBalance           1   1282.0 1320.0
## - BillLateCharge           1   1282.1 1320.1
## - TotalNetPurchaseAndCash  1   1282.2 1320.2
## - TotalNetPayments         1   1282.5 1320.5
## - IntStatusN               1   1282.7 1320.7
## - ExtStatusF               1   1283.1 1321.1
## - IntStatusD               1   1283.3 1321.3
## - ExtStatusI               1   1283.3 1321.3
## - TotalFeesBilled          1   1283.4 1321.4
## - EndingBalance            1   1283.5 1321.5
## <none>                         1281.8 1321.8
## - IntStatusX               1   1284.0 1322.0
## - Concessions              1   1285.2 1323.2
## - DisplayMinPay            1   1286.4 1324.4
## - DaysDeliq                1   1288.0 1326.0
## - Bscore                   1   1288.1 1326.1
## - QuarterlyCreditScore     1   1288.6 1326.6
## - OverlimitAmount          1   1288.8 1326.8
## - CreditLimit              1   1314.0 1352.0
## 
## Step:  AIC=1319.88
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - OpeningBalance           1   1282.1 1318.1
## - BillLateCharge           1   1282.3 1318.3
## - TotalNetPurchaseAndCash  1   1282.4 1318.4
## - TotalNetPayments         1   1282.6 1318.6
## - IntStatusN               1   1282.8 1318.8
## - ExtStatusF               1   1283.2 1319.2
## - IntStatusD               1   1283.4 1319.4
## - ExtStatusI               1   1283.5 1319.5
## - TotalFeesBilled          1   1283.5 1319.5
## - EndingBalance            1   1283.6 1319.6
## <none>                         1281.9 1319.9
## - IntStatusX               1   1284.2 1320.2
## - Concessions              1   1285.3 1321.3
## - DisplayMinPay            1   1286.5 1322.5
## - DaysDeliq                1   1288.1 1324.1
## - Bscore                   1   1288.2 1324.2
## - QuarterlyCreditScore     1   1288.9 1324.9
## - OverlimitAmount          1   1288.9 1324.9
## - CreditLimit              1   1314.2 1350.2
## 
## Step:  AIC=1318.09
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     BillLateCharge + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - BillLateCharge           1   1282.5 1316.5
## - IntStatusN               1   1283.0 1317.0
## - ExtStatusF               1   1283.4 1317.4
## - IntStatusD               1   1283.6 1317.6
## - ExtStatusI               1   1283.7 1317.7
## <none>                         1282.1 1318.1
## - IntStatusX               1   1284.4 1318.4
## - TotalFeesBilled          1   1285.0 1319.0
## - TotalNetPurchaseAndCash  1   1285.3 1319.3
## - Concessions              1   1286.0 1320.0
## - DisplayMinPay            1   1286.7 1320.7
## - TotalNetPayments         1   1287.5 1321.5
## - DaysDeliq                1   1288.3 1322.3
## - Bscore                   1   1288.5 1322.5
## - QuarterlyCreditScore     1   1289.0 1323.0
## - OverlimitAmount          1   1289.3 1323.3
## - EndingBalance            1   1304.9 1338.9
## - CreditLimit              1   1314.2 1348.2
## 
## Step:  AIC=1316.48
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - IntStatusN               1   1283.4 1315.4
## - ExtStatusF               1   1283.8 1315.8
## - IntStatusD               1   1283.8 1315.8
## - ExtStatusI               1   1284.0 1316.0
## - IntStatusX               1   1284.5 1316.5
## <none>                         1282.5 1316.5
## - TotalNetPurchaseAndCash  1   1285.5 1317.5
## - Concessions              1   1286.3 1318.3
## - DisplayMinPay            1   1286.9 1318.9
## - TotalNetPayments         1   1287.9 1319.9
## - Bscore                   1   1288.7 1320.7
## - DaysDeliq                1   1288.9 1320.9
## - QuarterlyCreditScore     1   1289.4 1321.4
## - OverlimitAmount          1   1289.5 1321.5
## - TotalFeesBilled          1   1293.0 1325.0
## - EndingBalance            1   1305.0 1337.0
## - CreditLimit              1   1315.4 1347.4
## 
## Step:  AIC=1315.38
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusX + 
##     DaysDeliq + OverlimitAmount + DisplayMinPay + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ExtStatusF               1   1284.7 1314.7
## - IntStatusD               1   1284.7 1314.7
## - ExtStatusI               1   1284.9 1314.9
## - IntStatusX               1   1285.4 1315.4
## <none>                         1283.4 1315.4
## - TotalNetPurchaseAndCash  1   1286.3 1316.3
## - Concessions              1   1287.3 1317.3
## - DisplayMinPay            1   1287.6 1317.6
## - TotalNetPayments         1   1288.9 1318.9
## - Bscore                   1   1289.6 1319.6
## - DaysDeliq                1   1289.7 1319.7
## - OverlimitAmount          1   1290.1 1320.1
## - QuarterlyCreditScore     1   1290.4 1320.4
## - TotalFeesBilled          1   1294.0 1324.0
## - EndingBalance            1   1306.6 1336.6
## - CreditLimit              1   1317.7 1347.7
## 
## Step:  AIC=1314.67
## .outcome ~ ExtStatusI + IntStatusD + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - IntStatusD               1   1285.7 1313.7
## - ExtStatusI               1   1286.3 1314.3
## - IntStatusX               1   1286.3 1314.3
## <none>                         1284.7 1314.7
## - TotalNetPurchaseAndCash  1   1288.1 1316.1
## - Concessions              1   1289.0 1317.0
## - DisplayMinPay            1   1289.0 1317.0
## - Bscore                   1   1289.7 1317.7
## - TotalNetPayments         1   1290.6 1318.6
## - DaysDeliq                1   1291.2 1319.2
## - OverlimitAmount          1   1291.6 1319.6
## - QuarterlyCreditScore     1   1291.9 1319.9
## - TotalFeesBilled          1   1294.9 1322.9
## - EndingBalance            1   1310.5 1338.5
## - CreditLimit              1   1322.2 1350.2
## 
## Step:  AIC=1313.67
## .outcome ~ ExtStatusI + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - IntStatusX               1   1286.3 1312.3
## - ExtStatusI               1   1287.2 1313.2
## <none>                         1285.7 1313.7
## - TotalNetPurchaseAndCash  1   1289.5 1315.5
## - Concessions              1   1289.9 1315.9
## - DisplayMinPay            1   1290.1 1316.1
## - DaysDeliq                1   1291.4 1317.4
## - TotalNetPayments         1   1292.3 1318.3
## - Bscore                   1   1292.5 1318.5
## - QuarterlyCreditScore     1   1293.0 1319.0
## - OverlimitAmount          1   1293.9 1319.9
## - TotalFeesBilled          1   1295.0 1321.0
## - EndingBalance            1   1311.5 1337.5
## - CreditLimit              1   1322.8 1348.8
## 
## Step:  AIC=1312.35
## .outcome ~ ExtStatusI + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ExtStatusI               1   1287.7 1311.7
## <none>                         1286.3 1312.3
## - TotalNetPurchaseAndCash  1   1290.1 1314.1
## - DisplayMinPay            1   1290.4 1314.4
## - Concessions              1   1290.5 1314.5
## - DaysDeliq                1   1291.4 1315.4
## - TotalNetPayments         1   1292.9 1316.9
## - QuarterlyCreditScore     1   1293.7 1317.7
## - OverlimitAmount          1   1293.9 1317.9
## - TotalFeesBilled          1   1295.1 1319.1
## - Bscore                   1   1296.7 1320.7
## - EndingBalance            1   1311.6 1335.6
## - CreditLimit              1   1323.4 1347.4
## 
## Step:  AIC=1311.73
## .outcome ~ DaysDeliq + OverlimitAmount + DisplayMinPay + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## <none>                         1287.7 1311.7
## - TotalNetPurchaseAndCash  1   1291.7 1313.7
## - DisplayMinPay            1   1291.9 1313.9
## - Concessions              1   1291.9 1313.9
## - DaysDeliq                1   1293.1 1315.1
## - TotalNetPayments         1   1294.4 1316.4
## - QuarterlyCreditScore     1   1295.1 1317.1
## - OverlimitAmount          1   1295.3 1317.3
## - TotalFeesBilled          1   1296.0 1318.0
## - Bscore                   1   1298.1 1320.1
## - EndingBalance            1   1313.6 1335.6
## - CreditLimit              1   1325.0 1347.0
## Start:  AIC=1312.44
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     ExtStatusZ + IntStatusD + IntStatusN + IntStatusO + IntStatusX + 
##     DaysDeliq + ActualMinPay + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
## 
## Step:  AIC=1312.44
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     ExtStatusZ + IntStatusD + IntStatusN + IntStatusO + IntStatusX + 
##     DaysDeliq + ActualMinPay + OverlimitAmount + OpeningBalance + 
##     BillLateCharge + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
## 
## Step:  AIC=1312.44
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     ActualMinPay + OverlimitAmount + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - TotalNetPurchaseAndCash  1   1268.5 1310.5
## - ExtStatusC               1   1268.5 1310.5
## - IntStatusO               1   1268.5 1310.5
## - OpeningBalance           1   1268.6 1310.6
## - TotalNetPayments         1   1268.6 1310.6
## - BillLateCharge           1   1268.7 1310.7
## - ExtStatusF               1   1268.9 1310.9
## - IntStatusD               1   1269.1 1311.1
## - IntStatusN               1   1269.2 1311.2
## - IntStatusX               1   1269.6 1311.6
## - EndingBalance            1   1269.8 1311.8
## - ExtStatusI               1   1269.9 1311.9
## - ExtStatusE               1   1270.0 1312.0
## <none>                         1268.4 1312.4
## - Concessions              1   1270.5 1312.5
## - TotalFeesBilled          1   1270.9 1312.9
## - QuarterlyCreditScore     1   1272.4 1314.4
## - ActualMinPay             1   1272.7 1314.7
## - DaysDeliq                1   1273.3 1315.3
## - OverlimitAmount          1   1273.3 1315.3
## - Bscore                   1   1273.4 1315.4
## - CreditLimit              1   1308.7 1350.7
## 
## Step:  AIC=1310.45
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     ActualMinPay + OverlimitAmount + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusC            1   1268.5 1308.5
## - IntStatusO            1   1268.5 1308.5
## - BillLateCharge        1   1268.7 1308.7
## - ExtStatusF            1   1268.9 1308.9
## - IntStatusD            1   1269.1 1309.1
## - IntStatusN            1   1269.2 1309.2
## - IntStatusX            1   1269.6 1309.6
## - ExtStatusI            1   1270.0 1310.0
## - ExtStatusE            1   1270.0 1310.0
## <none>                      1268.5 1310.5
## - TotalNetPayments      1   1270.5 1310.5
## - Concessions           1   1270.9 1310.9
## - TotalFeesBilled       1   1271.8 1311.8
## - QuarterlyCreditScore  1   1272.4 1312.4
## - OpeningBalance        1   1272.4 1312.4
## - ActualMinPay          1   1272.7 1312.7
## - DaysDeliq             1   1273.3 1313.3
## - OverlimitAmount       1   1273.3 1313.3
## - Bscore                1   1273.4 1313.4
## - EndingBalance         1   1281.7 1321.7
## - CreditLimit           1   1308.8 1348.8
## 
## Step:  AIC=1308.47
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusO + IntStatusX + DaysDeliq + ActualMinPay + 
##     OverlimitAmount + OpeningBalance + BillLateCharge + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusO            1   1268.5 1306.5
## - BillLateCharge        1   1268.7 1306.7
## - ExtStatusF            1   1268.9 1306.9
## - IntStatusD            1   1269.2 1307.2
## - IntStatusN            1   1269.2 1307.2
## - IntStatusX            1   1269.6 1307.6
## - ExtStatusI            1   1270.0 1308.0
## - ExtStatusE            1   1270.0 1308.0
## <none>                      1268.5 1308.5
## - TotalNetPayments      1   1270.5 1308.5
## - Concessions           1   1270.9 1308.9
## - TotalFeesBilled       1   1271.8 1309.8
## - QuarterlyCreditScore  1   1272.4 1310.4
## - OpeningBalance        1   1272.4 1310.4
## - ActualMinPay          1   1272.7 1310.7
## - DaysDeliq             1   1273.3 1311.3
## - OverlimitAmount       1   1273.4 1311.4
## - Bscore                1   1273.5 1311.5
## - EndingBalance         1   1281.7 1319.7
## - CreditLimit           1   1309.1 1347.1
## 
## Step:  AIC=1306.52
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusX + DaysDeliq + ActualMinPay + OverlimitAmount + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## - BillLateCharge        1   1268.8 1304.8
## - ExtStatusF            1   1268.9 1304.9
## - IntStatusN            1   1269.2 1305.2
## - IntStatusD            1   1269.2 1305.2
## - IntStatusX            1   1269.6 1305.6
## - ExtStatusI            1   1270.0 1306.0
## - ExtStatusE            1   1270.1 1306.1
## - TotalNetPayments      1   1270.5 1306.5
## <none>                      1268.5 1306.5
## - Concessions           1   1271.0 1307.0
## - TotalFeesBilled       1   1271.8 1307.8
## - QuarterlyCreditScore  1   1272.4 1308.4
## - OpeningBalance        1   1272.5 1308.5
## - ActualMinPay          1   1272.8 1308.8
## - OverlimitAmount       1   1273.4 1309.4
## - DaysDeliq             1   1273.5 1309.5
## - Bscore                1   1273.5 1309.5
## - EndingBalance         1   1282.6 1318.6
## - CreditLimit           1   1310.7 1346.7
## 
## Step:  AIC=1304.75
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusX + DaysDeliq + ActualMinPay + OverlimitAmount + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusF            1   1269.2 1303.2
## - IntStatusD            1   1269.4 1303.4
## - IntStatusN            1   1269.5 1303.5
## - IntStatusX            1   1269.7 1303.7
## - ExtStatusI            1   1270.2 1304.2
## - ExtStatusE            1   1270.3 1304.3
## <none>                      1268.8 1304.8
## - TotalNetPayments      1   1270.8 1304.8
## - Concessions           1   1271.2 1305.2
## - QuarterlyCreditScore  1   1272.6 1306.6
## - OpeningBalance        1   1272.7 1306.7
## - ActualMinPay          1   1272.8 1306.8
## - OverlimitAmount       1   1273.5 1307.5
## - Bscore                1   1273.7 1307.7
## - DaysDeliq             1   1273.9 1307.9
## - TotalFeesBilled       1   1279.2 1313.2
## - EndingBalance         1   1282.7 1316.7
## - CreditLimit           1   1311.4 1345.4
## 
## Step:  AIC=1303.17
## .outcome ~ ExtStatusE + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusX + DaysDeliq + ActualMinPay + OverlimitAmount + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusD            1   1269.7 1301.7
## - IntStatusN            1   1269.9 1301.9
## - IntStatusX            1   1270.0 1302.0
## - ExtStatusI            1   1270.7 1302.7
## - ExtStatusE            1   1270.7 1302.7
## - TotalNetPayments      1   1271.2 1303.2
## <none>                      1269.2 1303.2
## - Concessions           1   1271.8 1303.8
## - QuarterlyCreditScore  1   1273.2 1305.2
## - ActualMinPay          1   1273.3 1305.3
## - OpeningBalance        1   1273.4 1305.4
## - Bscore                1   1273.9 1305.9
## - OverlimitAmount       1   1274.3 1306.3
## - DaysDeliq             1   1274.5 1306.5
## - TotalFeesBilled       1   1279.3 1311.3
## - EndingBalance         1   1283.6 1315.6
## - CreditLimit           1   1314.1 1346.1
## 
## Step:  AIC=1301.66
## .outcome ~ ExtStatusE + ExtStatusI + IntStatusN + IntStatusX + 
##     DaysDeliq + ActualMinPay + OverlimitAmount + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusX            1   1270.0 1300.0
## - IntStatusN            1   1270.4 1300.4
## - ExtStatusI            1   1271.1 1301.1
## - ExtStatusE            1   1271.2 1301.2
## <none>                      1269.7 1301.7
## - TotalNetPayments      1   1271.8 1301.8
## - Concessions           1   1272.2 1302.2
## - ActualMinPay          1   1273.8 1303.8
## - QuarterlyCreditScore  1   1273.8 1303.8
## - OpeningBalance        1   1274.2 1304.2
## - DaysDeliq             1   1275.0 1305.0
## - Bscore                1   1275.8 1305.8
## - OverlimitAmount       1   1277.9 1307.9
## - TotalFeesBilled       1   1279.3 1309.3
## - EndingBalance         1   1283.7 1313.7
## - CreditLimit           1   1314.4 1344.4
## 
## Step:  AIC=1299.99
## .outcome ~ ExtStatusE + ExtStatusI + IntStatusN + DaysDeliq + 
##     ActualMinPay + OverlimitAmount + OpeningBalance + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusN            1   1270.7 1298.7
## - ExtStatusI            1   1271.3 1299.3
## - ExtStatusE            1   1271.5 1299.5
## <none>                      1270.0 1300.0
## - TotalNetPayments      1   1272.1 1300.1
## - Concessions           1   1272.5 1300.5
## - ActualMinPay          1   1273.9 1301.9
## - QuarterlyCreditScore  1   1274.1 1302.1
## - OpeningBalance        1   1274.5 1302.5
## - DaysDeliq             1   1275.1 1303.1
## - OverlimitAmount       1   1277.9 1305.9
## - Bscore                1   1278.8 1306.8
## - TotalFeesBilled       1   1279.3 1307.3
## - EndingBalance         1   1283.8 1311.8
## - CreditLimit           1   1315.7 1343.7
## 
## Step:  AIC=1298.71
## .outcome ~ ExtStatusE + ExtStatusI + DaysDeliq + ActualMinPay + 
##     OverlimitAmount + OpeningBalance + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusI            1   1272.1 1298.1
## - ExtStatusE            1   1272.3 1298.3
## <none>                      1270.7 1298.7
## - TotalNetPayments      1   1272.9 1298.9
## - Concessions           1   1273.3 1299.3
## - ActualMinPay          1   1274.5 1300.5
## - QuarterlyCreditScore  1   1274.9 1300.9
## - OpeningBalance        1   1275.1 1301.1
## - DaysDeliq             1   1275.7 1301.7
## - OverlimitAmount       1   1278.4 1304.4
## - Bscore                1   1279.5 1305.5
## - TotalFeesBilled       1   1280.1 1306.1
## - EndingBalance         1   1285.1 1311.1
## - CreditLimit           1   1317.9 1343.9
## 
## Step:  AIC=1298.06
## .outcome ~ ExtStatusE + DaysDeliq + ActualMinPay + OverlimitAmount + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusE            1   1273.6 1297.6
## <none>                      1272.1 1298.1
## - TotalNetPayments      1   1274.2 1298.2
## - Concessions           1   1274.6 1298.6
## - ActualMinPay          1   1275.9 1299.9
## - QuarterlyCreditScore  1   1276.2 1300.2
## - OpeningBalance        1   1276.6 1300.6
## - DaysDeliq             1   1277.3 1301.3
## - OverlimitAmount       1   1279.5 1303.5
## - Bscore                1   1280.8 1304.8
## - TotalFeesBilled       1   1280.9 1304.9
## - EndingBalance         1   1286.5 1310.5
## - CreditLimit           1   1319.6 1343.6
## 
## Step:  AIC=1297.6
## .outcome ~ DaysDeliq + ActualMinPay + OverlimitAmount + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## <none>                      1273.6 1297.6
## - TotalNetPayments      1   1275.7 1297.7
## - Concessions           1   1276.2 1298.2
## - ActualMinPay          1   1277.6 1299.6
## - QuarterlyCreditScore  1   1278.1 1300.1
## - OpeningBalance        1   1278.3 1300.3
## - DaysDeliq             1   1279.1 1301.1
## - OverlimitAmount       1   1281.1 1303.1
## - Bscore                1   1282.2 1304.2
## - TotalFeesBilled       1   1282.4 1304.4
## - EndingBalance         1   1288.1 1310.1
## - CreditLimit           1   1321.4 1343.4
## Start:  AIC=1310.42
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     ExtStatusZ + IntStatusD + IntStatusN + IntStatusO + IntStatusX + 
##     DaysDeliq + ActualMinPay + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
## 
## Step:  AIC=1310.42
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     ActualMinPay + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     BillLateCharge + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ActualMinPay             1   1264.4 1308.4
## - IntStatusO               1   1264.4 1308.4
## - TotalNetPurchaseAndCash  1   1264.4 1308.4
## - DisplayMinPay            1   1264.4 1308.4
## - TotalNetPayments         1   1264.5 1308.5
## - OverlimitAmount          1   1264.5 1308.5
## - ExtStatusC               1   1264.6 1308.6
## - ExtStatusE               1   1264.7 1308.7
## - OpeningBalance           1   1264.7 1308.7
## - BillLateCharge           1   1264.9 1308.9
## - ExtStatusF               1   1265.0 1309.0
## - IntStatusN               1   1265.3 1309.3
## - EndingBalance            1   1265.4 1309.4
## - IntStatusD               1   1265.5 1309.5
## - TotalFeesBilled          1   1265.7 1309.7
## - ExtStatusI               1   1265.8 1309.8
## - Concessions              1   1266.3 1310.3
## <none>                         1264.4 1310.4
## - IntStatusX               1   1267.1 1311.1
## - QuarterlyCreditScore     1   1268.4 1312.4
## - Bscore                   1   1268.5 1312.5
## - DaysDeliq                1   1273.4 1317.4
## - CreditLimit              1   1299.5 1343.5
## 
## Step:  AIC=1308.42
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - IntStatusO               1   1264.4 1306.4
## - TotalNetPurchaseAndCash  1   1264.4 1306.4
## - TotalNetPayments         1   1264.5 1306.5
## - ExtStatusC               1   1264.6 1306.6
## - ExtStatusE               1   1264.7 1306.7
## - OpeningBalance           1   1264.7 1306.7
## - BillLateCharge           1   1264.9 1306.9
## - ExtStatusF               1   1265.0 1307.0
## - IntStatusN               1   1265.3 1307.3
## - EndingBalance            1   1265.4 1307.4
## - IntStatusD               1   1265.5 1307.5
## - TotalFeesBilled          1   1265.7 1307.7
## - ExtStatusI               1   1265.8 1307.8
## - Concessions              1   1266.3 1308.3
## <none>                         1264.4 1308.4
## - IntStatusX               1   1267.1 1309.1
## - QuarterlyCreditScore     1   1268.4 1310.4
## - Bscore                   1   1268.5 1310.5
## - DisplayMinPay            1   1269.9 1311.9
## - OverlimitAmount          1   1272.1 1314.1
## - DaysDeliq                1   1273.4 1315.4
## - CreditLimit              1   1299.5 1341.5
## 
## Step:  AIC=1306.42
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + BillLateCharge + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - TotalNetPurchaseAndCash  1   1264.4 1304.4
## - TotalNetPayments         1   1264.5 1304.5
## - ExtStatusC               1   1264.6 1304.6
## - ExtStatusE               1   1264.7 1304.7
## - OpeningBalance           1   1264.7 1304.7
## - BillLateCharge           1   1264.9 1304.9
## - ExtStatusF               1   1265.0 1305.0
## - IntStatusN               1   1265.3 1305.3
## - EndingBalance            1   1265.4 1305.4
## - IntStatusD               1   1265.5 1305.5
## - TotalFeesBilled          1   1265.7 1305.7
## - ExtStatusI               1   1265.8 1305.8
## - Concessions              1   1266.3 1306.3
## <none>                         1264.4 1306.4
## - IntStatusX               1   1267.2 1307.2
## - QuarterlyCreditScore     1   1268.4 1308.4
## - Bscore                   1   1268.7 1308.7
## - DisplayMinPay            1   1270.1 1310.1
## - OverlimitAmount          1   1272.4 1312.4
## - DaysDeliq                1   1273.5 1313.5
## - CreditLimit              1   1301.4 1341.4
## 
## Step:  AIC=1304.42
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + BillLateCharge + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusC            1   1264.6 1302.6
## - ExtStatusE            1   1264.7 1302.7
## - BillLateCharge        1   1264.9 1302.9
## - ExtStatusF            1   1265.0 1303.0
## - IntStatusN            1   1265.3 1303.3
## - IntStatusD            1   1265.5 1303.5
## - TotalNetPayments      1   1265.8 1303.8
## - ExtStatusI            1   1265.8 1303.8
## - TotalFeesBilled       1   1266.0 1304.0
## <none>                      1264.4 1304.4
## - Concessions           1   1266.7 1304.7
## - IntStatusX            1   1267.2 1305.2
## - QuarterlyCreditScore  1   1268.4 1306.4
## - Bscore                1   1268.7 1306.7
## - DisplayMinPay         1   1270.1 1308.1
## - OpeningBalance        1   1270.2 1308.2
## - OverlimitAmount       1   1272.6 1310.6
## - DaysDeliq             1   1273.5 1311.5
## - EndingBalance         1   1276.1 1314.1
## - CreditLimit           1   1301.5 1339.5
## 
## Step:  AIC=1302.62
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusE            1   1264.9 1300.9
## - BillLateCharge        1   1265.1 1301.1
## - ExtStatusF            1   1265.2 1301.2
## - IntStatusN            1   1265.5 1301.5
## - IntStatusD            1   1265.7 1301.7
## - TotalNetPayments      1   1266.0 1302.0
## - ExtStatusI            1   1266.0 1302.0
## - TotalFeesBilled       1   1266.4 1302.4
## <none>                      1264.6 1302.6
## - Concessions           1   1266.9 1302.9
## - IntStatusX            1   1267.3 1303.3
## - QuarterlyCreditScore  1   1268.6 1304.6
## - Bscore                1   1268.8 1304.8
## - DisplayMinPay         1   1270.2 1306.2
## - OpeningBalance        1   1270.3 1306.3
## - OverlimitAmount       1   1272.7 1308.7
## - DaysDeliq             1   1273.6 1309.6
## - EndingBalance         1   1276.6 1312.6
## - CreditLimit           1   1302.7 1338.7
## 
## Step:  AIC=1300.87
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## - BillLateCharge        1   1265.4 1299.4
## - ExtStatusF            1   1265.4 1299.4
## - IntStatusN            1   1265.8 1299.8
## - IntStatusD            1   1266.0 1300.0
## - TotalNetPayments      1   1266.2 1300.2
## - ExtStatusI            1   1266.3 1300.3
## - TotalFeesBilled       1   1266.7 1300.7
## <none>                      1264.9 1300.9
## - Concessions           1   1267.1 1301.1
## - IntStatusX            1   1267.6 1301.6
## - QuarterlyCreditScore  1   1269.0 1303.0
## - Bscore                1   1269.0 1303.0
## - DisplayMinPay         1   1270.5 1304.5
## - OpeningBalance        1   1270.6 1304.6
## - OverlimitAmount       1   1273.0 1307.0
## - DaysDeliq             1   1273.9 1307.9
## - EndingBalance         1   1276.9 1310.9
## - CreditLimit           1   1303.0 1337.0
## 
## Step:  AIC=1299.38
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusF            1   1265.9 1297.9
## - IntStatusN            1   1266.2 1298.2
## - IntStatusD            1   1266.3 1298.3
## - ExtStatusI            1   1266.8 1298.8
## - TotalNetPayments      1   1266.8 1298.8
## <none>                      1265.4 1299.4
## - Concessions           1   1267.6 1299.6
## - IntStatusX            1   1267.7 1299.7
## - Bscore                1   1269.3 1301.3
## - QuarterlyCreditScore  1   1269.5 1301.5
## - DisplayMinPay         1   1270.8 1302.8
## - OpeningBalance        1   1271.0 1303.0
## - TotalFeesBilled       1   1272.7 1304.7
## - OverlimitAmount       1   1273.2 1305.2
## - DaysDeliq             1   1274.7 1306.7
## - EndingBalance         1   1276.9 1308.9
## - CreditLimit           1   1303.8 1335.8
## 
## Step:  AIC=1297.9
## .outcome ~ ExtStatusI + IntStatusD + IntStatusN + IntStatusX + 
##     DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusD            1   1266.6 1296.6
## - IntStatusN            1   1266.8 1296.8
## - TotalNetPayments      1   1267.2 1297.2
## - ExtStatusI            1   1267.3 1297.3
## <none>                      1265.9 1297.9
## - IntStatusX            1   1268.0 1298.0
## - Concessions           1   1268.2 1298.2
## - Bscore                1   1269.4 1299.4
## - QuarterlyCreditScore  1   1270.1 1300.1
## - DisplayMinPay         1   1271.4 1301.4
## - OpeningBalance        1   1271.9 1301.9
## - TotalFeesBilled       1   1273.0 1303.0
## - OverlimitAmount       1   1274.0 1304.0
## - DaysDeliq             1   1275.3 1305.3
## - EndingBalance         1   1277.8 1307.8
## - CreditLimit           1   1306.2 1336.2
## 
## Step:  AIC=1296.64
## .outcome ~ ExtStatusI + IntStatusN + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusN            1   1267.5 1295.5
## - ExtStatusI            1   1268.0 1296.0
## - IntStatusX            1   1268.1 1296.1
## - TotalNetPayments      1   1268.1 1296.1
## <none>                      1266.6 1296.6
## - Concessions           1   1268.9 1296.9
## - QuarterlyCreditScore  1   1271.0 1299.0
## - Bscore                1   1271.3 1299.3
## - DisplayMinPay         1   1272.2 1300.2
## - OpeningBalance        1   1273.0 1301.0
## - TotalFeesBilled       1   1273.1 1301.1
## - OverlimitAmount       1   1276.0 1304.0
## - DaysDeliq             1   1276.5 1304.5
## - EndingBalance         1   1278.3 1306.3
## - CreditLimit           1   1306.8 1334.8
## 
## Step:  AIC=1295.52
## .outcome ~ ExtStatusI + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusI            1   1268.9 1294.9
## - IntStatusX            1   1269.0 1295.0
## - TotalNetPayments      1   1269.0 1295.0
## <none>                      1267.5 1295.5
## - Concessions           1   1269.8 1295.8
## - QuarterlyCreditScore  1   1271.9 1297.9
## - Bscore                1   1272.2 1298.2
## - DisplayMinPay         1   1272.8 1298.8
## - OpeningBalance        1   1273.7 1299.7
## - TotalFeesBilled       1   1274.0 1300.0
## - OverlimitAmount       1   1276.4 1302.4
## - DaysDeliq             1   1277.2 1303.2
## - EndingBalance         1   1279.7 1305.7
## - CreditLimit           1   1309.1 1335.1
## 
## Step:  AIC=1294.89
## .outcome ~ IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusX            1   1270.1 1294.1
## - TotalNetPayments      1   1270.4 1294.4
## <none>                      1268.9 1294.9
## - Concessions           1   1271.2 1295.2
## - QuarterlyCreditScore  1   1273.2 1297.2
## - Bscore                1   1273.8 1297.8
## - DisplayMinPay         1   1274.2 1298.2
## - TotalFeesBilled       1   1274.8 1298.8
## - OpeningBalance        1   1275.3 1299.3
## - OverlimitAmount       1   1277.7 1301.7
## - DaysDeliq             1   1278.7 1302.7
## - EndingBalance         1   1281.1 1305.1
## - CreditLimit           1   1310.4 1334.4
## 
## Step:  AIC=1294.11
## .outcome ~ DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - TotalNetPayments      1   1271.6 1293.6
## <none>                      1270.1 1294.1
## - Concessions           1   1272.4 1294.4
## - QuarterlyCreditScore  1   1274.5 1296.5
## - DisplayMinPay         1   1274.8 1296.8
## - TotalFeesBilled       1   1275.4 1297.4
## - OpeningBalance        1   1276.5 1298.5
## - OverlimitAmount       1   1277.9 1299.9
## - Bscore                1   1278.2 1300.2
## - DaysDeliq             1   1278.7 1300.7
## - EndingBalance         1   1281.3 1303.3
## - CreditLimit           1   1310.6 1332.6
## 
## Step:  AIC=1293.63
## .outcome ~ DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## <none>                      1271.6 1293.6
## - Concessions           1   1274.7 1294.7
## - QuarterlyCreditScore  1   1276.4 1296.4
## - DisplayMinPay         1   1276.4 1296.4
## - TotalFeesBilled       1   1276.5 1296.5
## - DaysDeliq             1   1279.6 1299.6
## - Bscore                1   1280.0 1300.0
## - OverlimitAmount       1   1280.1 1300.1
## - OpeningBalance        1   1281.6 1301.6
## - EndingBalance         1   1281.6 1301.6
## - CreditLimit           1   1311.2 1331.2
## Start:  AIC=1327.59
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     ExtStatusZ + IntStatusD + IntStatusN + IntStatusO + IntStatusX + 
##     DaysDeliq + ActualMinPay + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
## 
## Step:  AIC=1327.59
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     ActualMinPay + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     BillLateCharge + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ActualMinPay             1   1281.6 1325.6
## - TotalNetPurchaseAndCash  1   1281.6 1325.6
## - DisplayMinPay            1   1281.6 1325.6
## - ExtStatusC               1   1281.6 1325.6
## - TotalNetPayments         1   1281.6 1325.6
## - OverlimitAmount          1   1281.6 1325.6
## - BillLateCharge           1   1281.7 1325.7
## - OpeningBalance           1   1281.8 1325.8
## - ExtStatusE               1   1281.9 1325.9
## - IntStatusO               1   1281.9 1325.9
## - IntStatusD               1   1281.9 1325.9
## - IntStatusX               1   1282.1 1326.1
## - ExtStatusF               1   1282.1 1326.1
## - IntStatusN               1   1282.5 1326.5
## - EndingBalance            1   1282.6 1326.6
## - ExtStatusI               1   1282.9 1326.9
## <none>                         1281.6 1327.6
## - TotalFeesBilled          1   1284.0 1328.0
## - Concessions              1   1284.2 1328.2
## - QuarterlyCreditScore     1   1286.1 1330.1
## - DaysDeliq                1   1287.3 1331.3
## - Bscore                   1   1287.9 1331.9
## - CreditLimit              1   1313.0 1357.0
## 
## Step:  AIC=1325.59
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - TotalNetPurchaseAndCash  1   1281.6 1323.6
## - ExtStatusC               1   1281.6 1323.6
## - TotalNetPayments         1   1281.6 1323.6
## - BillLateCharge           1   1281.7 1323.7
## - OpeningBalance           1   1281.8 1323.8
## - ExtStatusE               1   1281.9 1323.9
## - IntStatusO               1   1281.9 1323.9
## - IntStatusD               1   1281.9 1323.9
## - IntStatusX               1   1282.1 1324.1
## - ExtStatusF               1   1282.1 1324.1
## - IntStatusN               1   1282.5 1324.5
## - EndingBalance            1   1282.6 1324.6
## - ExtStatusI               1   1282.9 1324.9
## <none>                         1281.6 1325.6
## - TotalFeesBilled          1   1284.0 1326.0
## - Concessions              1   1284.2 1326.2
## - QuarterlyCreditScore     1   1286.1 1328.1
## - DaysDeliq                1   1287.3 1329.3
## - DisplayMinPay            1   1287.4 1329.4
## - Bscore                   1   1287.9 1329.9
## - OverlimitAmount          1   1290.2 1332.2
## - CreditLimit              1   1313.0 1355.0
## 
## Step:  AIC=1323.59
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusC            1   1281.6 1321.6
## - BillLateCharge        1   1281.7 1321.7
## - ExtStatusE            1   1281.9 1321.9
## - IntStatusO            1   1281.9 1321.9
## - IntStatusD            1   1281.9 1321.9
## - IntStatusX            1   1282.1 1322.1
## - ExtStatusF            1   1282.1 1322.1
## - IntStatusN            1   1282.5 1322.5
## - ExtStatusI            1   1282.9 1322.9
## - TotalNetPayments      1   1283.4 1323.4
## <none>                      1281.6 1323.6
## - TotalFeesBilled       1   1284.6 1324.6
## - Concessions           1   1284.8 1324.8
## - OpeningBalance        1   1284.9 1324.9
## - QuarterlyCreditScore  1   1286.1 1326.1
## - DaysDeliq             1   1287.3 1327.3
## - DisplayMinPay         1   1287.4 1327.4
## - Bscore                1   1287.9 1327.9
## - OverlimitAmount       1   1290.3 1330.3
## - EndingBalance         1   1293.2 1333.2
## - CreditLimit           1   1313.0 1353.0
## 
## Step:  AIC=1321.62
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusO + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + BillLateCharge + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - BillLateCharge        1   1281.7 1319.7
## - ExtStatusE            1   1281.9 1319.9
## - IntStatusO            1   1282.0 1320.0
## - IntStatusD            1   1282.0 1320.0
## - IntStatusX            1   1282.1 1320.1
## - ExtStatusF            1   1282.2 1320.2
## - IntStatusN            1   1282.6 1320.6
## - ExtStatusI            1   1282.9 1320.9
## - TotalNetPayments      1   1283.4 1321.4
## <none>                      1281.6 1321.6
## - TotalFeesBilled       1   1284.6 1322.6
## - Concessions           1   1284.8 1322.8
## - OpeningBalance        1   1284.9 1322.9
## - QuarterlyCreditScore  1   1286.2 1324.2
## - DaysDeliq             1   1287.3 1325.3
## - DisplayMinPay         1   1287.4 1325.4
## - Bscore                1   1288.1 1326.1
## - OverlimitAmount       1   1290.4 1328.4
## - EndingBalance         1   1293.3 1331.3
## - CreditLimit           1   1313.4 1351.4
## 
## Step:  AIC=1319.68
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusO + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusE            1   1282.0 1318.0
## - IntStatusD            1   1282.0 1318.0
## - IntStatusO            1   1282.0 1318.0
## - IntStatusX            1   1282.1 1318.1
## - ExtStatusF            1   1282.2 1318.2
## - IntStatusN            1   1282.6 1318.6
## - ExtStatusI            1   1283.0 1319.0
## - TotalNetPayments      1   1283.5 1319.5
## <none>                      1281.7 1319.7
## - Concessions           1   1284.9 1320.9
## - OpeningBalance        1   1284.9 1320.9
## - QuarterlyCreditScore  1   1286.2 1322.2
## - DisplayMinPay         1   1287.4 1323.4
## - DaysDeliq             1   1287.5 1323.5
## - Bscore                1   1288.1 1324.1
## - TotalFeesBilled       1   1289.2 1325.2
## - OverlimitAmount       1   1290.4 1326.4
## - EndingBalance         1   1293.4 1329.4
## - CreditLimit           1   1313.6 1349.6
## 
## Step:  AIC=1317.97
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusO + IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusO            1   1282.3 1316.3
## - IntStatusD            1   1282.3 1316.3
## - IntStatusX            1   1282.4 1316.4
## - ExtStatusF            1   1282.5 1316.5
## - IntStatusN            1   1282.9 1316.9
## - ExtStatusI            1   1283.3 1317.3
## - TotalNetPayments      1   1283.8 1317.8
## <none>                      1282.0 1318.0
## - Concessions           1   1285.2 1319.2
## - OpeningBalance        1   1285.3 1319.3
## - QuarterlyCreditScore  1   1286.7 1320.7
## - DisplayMinPay         1   1287.8 1321.8
## - DaysDeliq             1   1287.9 1321.9
## - Bscore                1   1288.4 1322.4
## - TotalFeesBilled       1   1289.6 1323.6
## - OverlimitAmount       1   1290.8 1324.8
## - EndingBalance         1   1293.7 1327.7
## - CreditLimit           1   1314.0 1348.0
## 
## Step:  AIC=1316.31
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusX            1   1282.7 1314.7
## - IntStatusD            1   1282.7 1314.7
## - ExtStatusF            1   1282.8 1314.8
## - IntStatusN            1   1283.3 1315.3
## - ExtStatusI            1   1283.6 1315.6
## - TotalNetPayments      1   1284.0 1316.0
## <none>                      1282.3 1316.3
## - Concessions           1   1285.5 1317.5
## - OpeningBalance        1   1285.7 1317.7
## - QuarterlyCreditScore  1   1287.0 1319.0
## - DisplayMinPay         1   1287.8 1319.8
## - Bscore                1   1288.4 1320.4
## - DaysDeliq             1   1288.6 1320.6
## - TotalFeesBilled       1   1290.0 1322.0
## - OverlimitAmount       1   1290.8 1322.8
## - EndingBalance         1   1293.9 1325.9
## - CreditLimit           1   1314.5 1346.5
## 
## Step:  AIC=1314.65
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusN + 
##     DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusD            1   1282.8 1312.8
## - ExtStatusF            1   1283.1 1313.1
## - IntStatusN            1   1283.6 1313.6
## - ExtStatusI            1   1283.9 1313.9
## - TotalNetPayments      1   1284.4 1314.4
## <none>                      1282.7 1314.7
## - Concessions           1   1285.8 1315.8
## - OpeningBalance        1   1286.2 1316.2
## - QuarterlyCreditScore  1   1287.4 1317.4
## - DisplayMinPay         1   1288.0 1318.0
## - DaysDeliq             1   1290.0 1320.0
## - TotalFeesBilled       1   1290.1 1320.1
## - Bscore                1   1290.6 1320.6
## - OverlimitAmount       1   1291.0 1321.0
## - EndingBalance         1   1293.9 1323.9
## - CreditLimit           1   1314.8 1344.8
## 
## Step:  AIC=1312.76
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusN + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusF            1   1283.1 1311.1
## - IntStatusN            1   1283.7 1311.7
## - ExtStatusI            1   1284.0 1312.0
## - TotalNetPayments      1   1284.6 1312.6
## <none>                      1282.8 1312.8
## - Concessions           1   1285.9 1313.9
## - OpeningBalance        1   1286.4 1314.4
## - QuarterlyCreditScore  1   1287.5 1315.5
## - DisplayMinPay         1   1288.2 1316.2
## - TotalFeesBilled       1   1290.2 1318.2
## - DaysDeliq             1   1290.2 1318.2
## - Bscore                1   1290.6 1318.6
## - OverlimitAmount       1   1292.2 1320.2
## - EndingBalance         1   1294.4 1322.4
## - CreditLimit           1   1316.7 1344.7
## 
## Step:  AIC=1311.13
## .outcome ~ ExtStatusI + IntStatusN + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## - IntStatusN            1   1284.1 1310.1
## - ExtStatusI            1   1284.4 1310.4
## - TotalNetPayments      1   1284.9 1310.9
## <none>                      1283.1 1311.1
## - Concessions           1   1286.5 1312.5
## - OpeningBalance        1   1287.0 1313.0
## - QuarterlyCreditScore  1   1288.0 1314.0
## - DisplayMinPay         1   1288.7 1314.7
## - TotalFeesBilled       1   1290.5 1316.5
## - DaysDeliq             1   1291.1 1317.1
## - Bscore                1   1292.2 1318.2
## - OverlimitAmount       1   1292.8 1318.8
## - EndingBalance         1   1295.2 1321.2
## - CreditLimit           1   1318.8 1344.8
## 
## Step:  AIC=1310.12
## .outcome ~ ExtStatusI + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusI            1   1285.4 1309.4
## - TotalNetPayments      1   1286.0 1310.0
## <none>                      1284.1 1310.1
## - Concessions           1   1287.5 1311.5
## - OpeningBalance        1   1287.9 1311.9
## - QuarterlyCreditScore  1   1289.1 1313.1
## - DisplayMinPay         1   1289.4 1313.4
## - TotalFeesBilled       1   1291.5 1315.5
## - DaysDeliq             1   1291.8 1315.8
## - Bscore                1   1293.3 1317.3
## - OverlimitAmount       1   1293.3 1317.3
## - EndingBalance         1   1296.9 1320.9
## - CreditLimit           1   1321.3 1345.3
## 
## Step:  AIC=1309.39
## .outcome ~ DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - TotalNetPayments      1   1287.2 1309.2
## <none>                      1285.4 1309.4
## - Concessions           1   1288.8 1310.8
## - OpeningBalance        1   1289.3 1311.3
## - QuarterlyCreditScore  1   1290.3 1312.3
## - DisplayMinPay         1   1290.8 1312.8
## - TotalFeesBilled       1   1292.3 1314.3
## - DaysDeliq             1   1293.5 1315.5
## - Bscore                1   1294.5 1316.5
## - OverlimitAmount       1   1294.6 1316.6
## - EndingBalance         1   1298.3 1320.3
## - CreditLimit           1   1322.8 1344.8
## 
## Step:  AIC=1309.22
## .outcome ~ DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## <none>                      1287.2 1309.2
## - Concessions           1   1291.8 1311.8
## - DisplayMinPay         1   1292.6 1312.6
## - QuarterlyCreditScore  1   1292.7 1312.7
## - TotalFeesBilled       1   1293.7 1313.7
## - OpeningBalance        1   1294.2 1314.2
## - DaysDeliq             1   1294.5 1314.5
## - OverlimitAmount       1   1296.8 1316.8
## - Bscore                1   1296.9 1316.9
## - EndingBalance         1   1298.6 1318.6
## - CreditLimit           1   1323.1 1343.1
## Start:  AIC=1453.47
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     ExtStatusZ + IntStatusD + IntStatusN + IntStatusO + IntStatusX + 
##     DaysDeliq + ActualMinPay + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalNetPurchaseAndCash + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
## 
## Step:  AIC=1453.47
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     ActualMinPay + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     BillLateCharge + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalNetPurchaseAndCash + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - ActualMinPay             1   1407.5 1451.5
## - DisplayMinPay            1   1407.5 1451.5
## - TotalNetPurchaseAndCash  1   1407.5 1451.5
## - TotalNetPayments         1   1407.5 1451.5
## - OverlimitAmount          1   1407.5 1451.5
## - ExtStatusC               1   1407.5 1451.5
## - IntStatusO               1   1407.6 1451.6
## - BillLateCharge           1   1407.7 1451.7
## - ExtStatusE               1   1407.7 1451.7
## - OpeningBalance           1   1407.7 1451.7
## - ExtStatusF               1   1408.2 1452.2
## - IntStatusN               1   1408.3 1452.3
## - EndingBalance            1   1408.4 1452.4
## - IntStatusD               1   1408.8 1452.8
## - ExtStatusI               1   1409.0 1453.0
## <none>                         1407.5 1453.5
## - IntStatusX               1   1409.7 1453.7
## - Concessions              1   1410.0 1454.0
## - TotalFeesBilled          1   1410.9 1454.9
## - QuarterlyCreditScore     1   1413.3 1457.3
## - DaysDeliq                1   1414.1 1458.1
## - Bscore                   1   1414.3 1458.3
## - CreditLimit              1   1446.0 1490.0
## 
## Step:  AIC=1451.47
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalNetPurchaseAndCash + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                           Df Deviance    AIC
## - TotalNetPurchaseAndCash  1   1407.5 1449.5
## - TotalNetPayments         1   1407.5 1449.5
## - ExtStatusC               1   1407.5 1449.5
## - IntStatusO               1   1407.6 1449.6
## - BillLateCharge           1   1407.7 1449.7
## - ExtStatusE               1   1407.7 1449.7
## - OpeningBalance           1   1407.7 1449.7
## - ExtStatusF               1   1408.2 1450.2
## - IntStatusN               1   1408.3 1450.3
## - EndingBalance            1   1408.4 1450.4
## - IntStatusD               1   1408.8 1450.8
## - ExtStatusI               1   1409.0 1451.0
## <none>                         1407.5 1451.5
## - IntStatusX               1   1409.7 1451.7
## - Concessions              1   1410.0 1452.0
## - TotalFeesBilled          1   1410.9 1452.9
## - DisplayMinPay            1   1412.8 1454.8
## - QuarterlyCreditScore     1   1413.3 1455.3
## - DaysDeliq                1   1414.1 1456.1
## - Bscore                   1   1414.3 1456.3
## - OverlimitAmount          1   1415.5 1457.5
## - CreditLimit              1   1446.0 1488.0
## 
## Step:  AIC=1449.48
## .outcome ~ ExtStatusC + ExtStatusE + ExtStatusF + ExtStatusI + 
##     IntStatusD + IntStatusN + IntStatusO + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + BillLateCharge + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusC            1   1407.5 1447.5
## - IntStatusO            1   1407.6 1447.6
## - BillLateCharge        1   1407.7 1447.7
## - ExtStatusE            1   1407.7 1447.7
## - ExtStatusF            1   1408.2 1448.2
## - IntStatusN            1   1408.3 1448.3
## - IntStatusD            1   1408.8 1448.8
## - ExtStatusI            1   1409.0 1449.0
## - TotalNetPayments      1   1409.3 1449.3
## <none>                      1407.5 1449.5
## - IntStatusX            1   1409.7 1449.7
## - Concessions           1   1410.8 1450.8
## - OpeningBalance        1   1411.5 1451.5
## - TotalFeesBilled       1   1411.6 1451.6
## - DisplayMinPay         1   1412.8 1452.8
## - QuarterlyCreditScore  1   1413.3 1453.3
## - DaysDeliq             1   1414.1 1454.1
## - Bscore                1   1414.3 1454.3
## - OverlimitAmount       1   1415.5 1455.5
## - EndingBalance         1   1419.9 1459.9
## - CreditLimit           1   1446.1 1486.1
## 
## Step:  AIC=1447.54
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusO + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + BillLateCharge + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusO            1   1407.7 1445.7
## - BillLateCharge        1   1407.8 1445.8
## - ExtStatusE            1   1407.8 1445.8
## - ExtStatusF            1   1408.2 1446.2
## - IntStatusN            1   1408.4 1446.4
## - IntStatusD            1   1408.8 1446.8
## - ExtStatusI            1   1409.1 1447.1
## - TotalNetPayments      1   1409.3 1447.3
## <none>                      1407.5 1447.5
## - IntStatusX            1   1409.8 1447.8
## - Concessions           1   1410.8 1448.8
## - OpeningBalance        1   1411.6 1449.6
## - TotalFeesBilled       1   1411.6 1449.6
## - DisplayMinPay         1   1412.8 1450.8
## - QuarterlyCreditScore  1   1413.3 1451.3
## - DaysDeliq             1   1414.2 1452.2
## - Bscore                1   1414.6 1452.6
## - OverlimitAmount       1   1415.7 1453.7
## - EndingBalance         1   1419.9 1457.9
## - CreditLimit           1   1446.4 1484.4
## 
## Step:  AIC=1445.66
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + BillLateCharge + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## - BillLateCharge        1   1407.9 1443.9
## - ExtStatusE            1   1407.9 1443.9
## - ExtStatusF            1   1408.3 1444.3
## - IntStatusN            1   1408.5 1444.5
## - IntStatusD            1   1409.0 1445.0
## - ExtStatusI            1   1409.2 1445.2
## - TotalNetPayments      1   1409.4 1445.4
## <none>                      1407.7 1445.7
## - IntStatusX            1   1409.8 1445.8
## - Concessions           1   1411.0 1447.0
## - TotalFeesBilled       1   1411.8 1447.8
## - OpeningBalance        1   1411.8 1447.8
## - DisplayMinPay         1   1412.8 1448.8
## - QuarterlyCreditScore  1   1413.5 1449.5
## - DaysDeliq             1   1414.5 1450.5
## - Bscore                1   1414.6 1450.6
## - OverlimitAmount       1   1415.7 1451.7
## - EndingBalance         1   1420.6 1456.6
## - CreditLimit           1   1447.5 1483.5
## 
## Step:  AIC=1443.87
## .outcome ~ ExtStatusE + ExtStatusF + ExtStatusI + IntStatusD + 
##     IntStatusN + IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusE            1   1408.1 1442.1
## - ExtStatusF            1   1408.5 1442.5
## - IntStatusN            1   1408.7 1442.7
## - IntStatusD            1   1409.1 1443.1
## - ExtStatusI            1   1409.4 1443.4
## - TotalNetPayments      1   1409.6 1443.6
## - IntStatusX            1   1409.8 1443.8
## <none>                      1407.9 1443.9
## - Concessions           1   1411.1 1445.1
## - OpeningBalance        1   1411.9 1445.9
## - DisplayMinPay         1   1412.9 1446.9
## - QuarterlyCreditScore  1   1413.7 1447.7
## - Bscore                1   1414.7 1448.7
## - DaysDeliq             1   1415.0 1449.0
## - OverlimitAmount       1   1415.8 1449.8
## - TotalFeesBilled       1   1420.6 1454.6
## - EndingBalance         1   1420.6 1454.6
## - CreditLimit           1   1448.2 1482.2
## 
## Step:  AIC=1442.14
## .outcome ~ ExtStatusF + ExtStatusI + IntStatusD + IntStatusN + 
##     IntStatusX + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusF            1   1408.8 1440.8
## - IntStatusN            1   1409.0 1441.0
## - IntStatusD            1   1409.4 1441.4
## - ExtStatusI            1   1409.6 1441.6
## - TotalNetPayments      1   1409.9 1441.9
## - IntStatusX            1   1410.1 1442.1
## <none>                      1408.1 1442.1
## - Concessions           1   1411.4 1443.4
## - OpeningBalance        1   1412.2 1444.2
## - DisplayMinPay         1   1413.2 1445.2
## - QuarterlyCreditScore  1   1414.1 1446.1
## - Bscore                1   1414.9 1446.9
## - DaysDeliq             1   1415.3 1447.3
## - OverlimitAmount       1   1416.1 1448.1
## - EndingBalance         1   1420.8 1452.8
## - TotalFeesBilled       1   1420.9 1452.9
## - CreditLimit           1   1448.6 1480.6
## 
## Step:  AIC=1440.79
## .outcome ~ ExtStatusI + IntStatusD + IntStatusN + IntStatusX + 
##     DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusN            1   1409.7 1439.7
## - IntStatusD            1   1409.9 1439.9
## - ExtStatusI            1   1410.3 1440.3
## - TotalNetPayments      1   1410.5 1440.5
## - IntStatusX            1   1410.6 1440.6
## <none>                      1408.8 1440.8
## - Concessions           1   1412.3 1442.3
## - OpeningBalance        1   1413.2 1443.2
## - DisplayMinPay         1   1414.0 1444.0
## - QuarterlyCreditScore  1   1414.9 1444.9
## - Bscore                1   1415.2 1445.2
## - DaysDeliq             1   1416.1 1446.1
## - OverlimitAmount       1   1417.0 1447.0
## - TotalFeesBilled       1   1421.3 1451.3
## - EndingBalance         1   1422.0 1452.0
## - CreditLimit           1   1451.3 1481.3
## 
## Step:  AIC=1439.67
## .outcome ~ ExtStatusI + IntStatusD + IntStatusX + DaysDeliq + 
##     OverlimitAmount + DisplayMinPay + OpeningBalance + EndingBalance + 
##     CreditLimit + TotalNetPayments + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - IntStatusD            1   1410.7 1438.7
## - ExtStatusI            1   1411.2 1439.2
## - TotalNetPayments      1   1411.5 1439.5
## - IntStatusX            1   1411.5 1439.5
## <none>                      1409.7 1439.7
## - Concessions           1   1413.2 1441.2
## - OpeningBalance        1   1414.0 1442.0
## - DisplayMinPay         1   1414.6 1442.6
## - QuarterlyCreditScore  1   1415.9 1443.9
## - Bscore                1   1416.1 1444.1
## - DaysDeliq             1   1416.8 1444.8
## - OverlimitAmount       1   1417.5 1445.5
## - TotalFeesBilled       1   1422.2 1450.2
## - EndingBalance         1   1423.5 1451.5
## - CreditLimit           1   1453.7 1481.7
## 
## Step:  AIC=1438.74
## .outcome ~ ExtStatusI + IntStatusX + DaysDeliq + OverlimitAmount + 
##     DisplayMinPay + OpeningBalance + EndingBalance + CreditLimit + 
##     TotalNetPayments + TotalFeesBilled + Concessions + QuarterlyCreditScore + 
##     Bscore
## 
##                        Df Deviance    AIC
## - IntStatusX            1   1411.5 1437.5
## - ExtStatusI            1   1412.2 1438.2
## - TotalNetPayments      1   1412.7 1438.7
## <none>                      1410.7 1438.7
## - Concessions           1   1414.2 1440.2
## - OpeningBalance        1   1415.5 1441.5
## - DisplayMinPay         1   1415.7 1441.7
## - QuarterlyCreditScore  1   1417.1 1443.1
## - DaysDeliq             1   1417.1 1443.1
## - Bscore                1   1419.3 1445.3
## - OverlimitAmount       1   1419.8 1445.8
## - TotalFeesBilled       1   1422.3 1448.3
## - EndingBalance         1   1424.2 1450.2
## - CreditLimit           1   1454.6 1480.6
## 
## Step:  AIC=1437.5
## .outcome ~ ExtStatusI + DaysDeliq + OverlimitAmount + DisplayMinPay + 
##     OpeningBalance + EndingBalance + CreditLimit + TotalNetPayments + 
##     TotalFeesBilled + Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - ExtStatusI            1   1412.8 1436.8
## - TotalNetPayments      1   1413.5 1437.5
## <none>                      1411.5 1437.5
## - Concessions           1   1414.9 1438.9
## - DisplayMinPay         1   1416.0 1440.0
## - OpeningBalance        1   1416.2 1440.2
## - DaysDeliq             1   1417.2 1441.2
## - QuarterlyCreditScore  1   1417.8 1441.8
## - OverlimitAmount       1   1419.9 1443.9
## - TotalFeesBilled       1   1422.4 1446.4
## - Bscore                1   1424.0 1448.0
## - EndingBalance         1   1424.2 1448.2
## - CreditLimit           1   1455.2 1479.2
## 
## Step:  AIC=1436.83
## .outcome ~ DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalNetPayments + TotalFeesBilled + 
##     Concessions + QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## - TotalNetPayments      1   1414.8 1436.8
## <none>                      1412.8 1436.8
## - Concessions           1   1416.2 1438.2
## - DisplayMinPay         1   1417.5 1439.5
## - OpeningBalance        1   1417.7 1439.7
## - DaysDeliq             1   1418.8 1440.8
## - QuarterlyCreditScore  1   1419.1 1441.1
## - OverlimitAmount       1   1421.3 1443.3
## - TotalFeesBilled       1   1423.2 1445.2
## - Bscore                1   1425.3 1447.3
## - EndingBalance         1   1425.7 1447.7
## - CreditLimit           1   1456.8 1478.8
## 
## Step:  AIC=1436.76
## .outcome ~ DaysDeliq + OverlimitAmount + DisplayMinPay + OpeningBalance + 
##     EndingBalance + CreditLimit + TotalFeesBilled + Concessions + 
##     QuarterlyCreditScore + Bscore
## 
##                        Df Deviance    AIC
## <none>                      1414.8 1436.8
## - DisplayMinPay         1   1419.4 1439.4
## - Concessions           1   1419.5 1439.5
## - DaysDeliq             1   1420.1 1440.1
## - QuarterlyCreditScore  1   1421.5 1441.5
## - OpeningBalance        1   1423.0 1443.0
## - OverlimitAmount       1   1423.6 1443.6
## - TotalFeesBilled       1   1424.4 1444.4
## - EndingBalance         1   1425.9 1445.9
## - Bscore                1   1427.7 1447.7
## - CreditLimit           1   1457.2 1477.2
summary(logit_mod1)
## 
## Call:
## NULL
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -3.4724  -0.6807  -0.3227   0.4208   2.7258  
## 
## Coefficients:
##                        Estimate Std. Error z value Pr(>|z|)    
## (Intercept)           5.4188528  1.7314184   3.130  0.00175 ** 
## DaysDeliq             0.0288117  0.0122500   2.352  0.01867 *  
## OverlimitAmount       0.0330381  0.0113740   2.905  0.00368 ** 
## DisplayMinPay        -0.0204752  0.0092877  -2.205  0.02749 *  
## OpeningBalance        0.0023956  0.0008643   2.772  0.00557 ** 
## EndingBalance         0.0038518  0.0012060   3.194  0.00140 ** 
## CreditLimit          -0.0064721  0.0011446  -5.654 1.56e-08 ***
## TotalFeesBilled       0.0187208  0.0061882   3.025  0.00248 ** 
## Concessions          -0.0208900  0.0099636  -2.097  0.03603 *  
## QuarterlyCreditScore -0.0012499  0.0004773  -2.619  0.00883 ** 
## Bscore               -0.0082409  0.0027010  -3.051  0.00228 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 2414.9  on 1767  degrees of freedom
## Residual deviance: 1414.8  on 1757  degrees of freedom
## AIC: 1436.8
## 
## Number of Fisher Scoring iterations: 7
varImp(logit_mod1$finalModel)
# get the confusion matrix for the logistic model
logitmod1_cart1 <- bind_cols(
  predict(logit_mod1, newdata = test, type = "prob"),
  Predicted = predict(logit_mod1, newdata = test, type = "raw"),
  Actual = test$bad
)

logitmod1_cart1$Actual <- as.factor(logitmod1_cart1$Actual)
logitmod1_cart2 <- confusionMatrix(logitmod1_cart1$Predicted, logitmod1_cart1$Actual)
logitmod1_cart2
## Confusion Matrix and Statistics
## 
##           Reference
## Prediction  No Yes
##        No  601 139
##        Yes  71 366
##                                           
##                Accuracy : 0.8216          
##                  95% CI : (0.7985, 0.8431)
##     No Information Rate : 0.5709          
##     P-Value [Acc > NIR] : < 2.2e-16       
##                                           
##                   Kappa : 0.6296          
##                                           
##  Mcnemar's Test P-Value : 3.774e-06       
##                                           
##             Sensitivity : 0.8943          
##             Specificity : 0.7248          
##          Pos Pred Value : 0.8122          
##          Neg Pred Value : 0.8375          
##              Prevalence : 0.5709          
##          Detection Rate : 0.5106          
##    Detection Prevalence : 0.6287          
##       Balanced Accuracy : 0.8095          
##                                           
##        'Positive' Class : No              
## 
# get the roc curve for logistic model
log_auc <- Metrics::auc(actual = logitmod1_cart1$Actual == "No", logitmod1_cart1$No)
yardstick::roc_curve(logitmod1_cart1, Actual, No) %>%
  autoplot() +
  labs(
    title = "logistic ROC Curve ",
    subtitle = paste0("AUC = ", round(log_auc, 4))
  )

# get the gains curve and lift plot
library(modelplotr)
## Package modelplotr loaded! Happy model plotting!
scores_and_ntiles <- prepare_scores_and_ntiles(datasets=list("train","test"),
                                               dataset_labels = list("train data","test data"),
                                               models = list("tree_mod1","logit_mod1"),
                                               model_labels = list("decision tree","logistic"),
                                               target_column="bad",
                                               ntiles=100)
## Warning: `select_()` was deprecated in dplyr 0.7.0.
## ℹ Please use `select()` instead.
## ℹ The deprecated feature was likely used in the modelplotr package.
##   Please report the issue at <]8;;https://github.com/jurrr/modelplotr/issueshttps://github.com/jurrr/modelplotr/issues]8;;>.
## ... scoring caret model "tree_mod1" on dataset "train".
## ... scoring caret model "logit_mod1" on dataset "train".
## ... scoring caret model "tree_mod1" on dataset "test".
## ... scoring caret model "logit_mod1" on dataset "test".
## Data preparation step 1 succeeded! Dataframe created.
# set plotting scope to model comparison
plot_input <- plotting_scope(prepared_input = scores_and_ntiles,scope = "compare_models")
## Warning: `group_by_()` was deprecated in dplyr 0.7.0.
## ℹ Please use `group_by()` instead.
## ℹ See vignette('programming') for more help
## ℹ The deprecated feature was likely used in the modelplotr package.
##   Please report the issue at <]8;;https://github.com/jurrr/modelplotr/issueshttps://github.com/jurrr/modelplotr/issues]8;;>.
## Data preparation step 2 succeeded! Dataframe created.
## "prepared_input" aggregated...
## Data preparation step 3 succeeded! Dataframe created.
## 
## Models "decision tree", "logistic" compared for dataset "test data" and target value "Yes".
# plot the gains and lift plot and annotate the plot at ntile 20
plot_cumgains(data = plot_input,highlight_ntile = 20)
## Warning: Vectorized input to `element_text()` is not officially supported.
## ℹ Results may be unexpected or may change in future versions of ggplot2.
##  
## Plot annotation for plot: Cumulative gains
## - When we select 20% with the highest probability according to model decision tree, this selection holds 43% of all Yes cases in test data. 
## - When we select 20% with the highest probability according to model logistic, this selection holds 45% of all Yes cases in test data. 
##  
## 

plot_cumlift(data = plot_input,highlight_ntile = 20)
## Warning: Vectorized input to `element_text()` is not officially supported.
## ℹ Results may be unexpected or may change in future versions of ggplot2.
##  
## Plot annotation for plot: Cumulative lift
## - When we select 20% with the highest probability according to model decision tree in test data, this selection for Yes cases is 2.1 times better than selecting without a model. 
## - When we select 20% with the highest probability according to model logistic in test data, this selection for Yes cases is 2.3 times better than selecting without a model. 
##  
## 

#Cumulative response plot
plot_cumresponse(data = plot_input, highlight_ntile = 20)
## Warning: Vectorized input to `element_text()` is not officially supported.
## ℹ Results may be unexpected or may change in future versions of ggplot2.
##  
## Plot annotation for plot: Cumulative response
## - When we select ntiles 1 until 20 according to model decision tree in dataset test data the % of Yes cases in the selection is 91.9%. 
## - When we select ntiles 1 until 20 according to model logistic in dataset test data the % of Yes cases in the selection is 97.0%. 
##  
## 

#Converting Yes to 1 and No to 0 in df1 

logrec_df <- logitmod1_cart1
treerec_df <- treemod1_cart1

logrec_df$Predicted<-ifelse(logrec_df$Predicted=="Yes",1,0)
logrec_df$Actual<-ifelse(logrec_df$Actual=="Yes",1,0)


treerec_df$Predicted<-ifelse(treerec_df$Predicted=="Yes",1,0)
treerec_df$Actual<-ifelse(treerec_df$Actual=="Yes",1,0)


library(InformationValue)
## 
## Attaching package: 'InformationValue'
## The following objects are masked from 'package:caret':
## 
##     confusionMatrix, precision, recall, sensitivity, specificity
# compute the ks stat for the logistic model
ks_stat(logrec_df$Actual, logrec_df$Predicted)
## [1] 0.5913
# make ks plot for the logistic regression
ks_plot(logrec_df$Actual, logrec_df$Predicted)

# compute the ks stat for the tree model
ks_stat(treerec_df$Actual, treerec_df$Predicted)
## [1] 0.5427
# compute the ks plot for the tree
ks_plot(treerec_df$Actual, treerec_df$Predicted)

select important variables

df2 <- model_df
# select minimal variables for plotting
df3 <- df2 %>% dplyr::select(c(1:4), 17)
df4 <- df2 %>% dplyr::select(c(5:8), 17)
df5 <- df2 %>% dplyr::select(c(9:12), 17)
df6 <- df2 %>% dplyr::select(c(13:17))
library(GGally)
df3 %>%
ggpairs(aes(col = bad, fill = bad, alpha = 0.6),
        upper = list(combo = 'box'),
        diag = list(discrete = wrap('barDiag', position = 'fill')),
        lower = "blank") +
    theme(axis.text.x = element_text(angle = 90, hjust = 1))

df4 %>%
ggpairs(aes(col = bad, fill = bad, alpha = 0.6),
        upper = list(combo = 'box'),
        diag = list(discrete = wrap('barDiag', position = 'fill')),
        lower = "blank") +
    theme(axis.text.x = element_text(angle = 90, hjust = 1))

df5 %>%
ggpairs(aes(col = bad, fill = bad, alpha = 0.6),
        upper = list(combo = 'box'),
        diag = list(discrete = wrap('barDiag', position = 'fill')),
        lower = "blank") +
    theme(axis.text.x = element_text(angle = 90, hjust = 1))

df6 %>%
ggpairs(aes(col = bad, fill = bad, alpha = 0.6),
        upper = list(combo = 'box'),
        diag = list(discrete = wrap('barDiag', position = 'fill')),
        lower = "blank") +
    theme(axis.text.x = element_text(angle = 90, hjust = 1))

library(reshape2)
## 
## Attaching package: 'reshape2'
## The following object is masked from 'package:tidyr':
## 
##     smiths
df.m <- melt(df_new[, -c(1:3)], id.var = "Bad")
head(df.m)
df.m$Bad <- as.factor(df.m$Bad)
p <- ggplot(data = df.m, aes(x=variable, y=value)) + 
             geom_boxplot(aes(fill=as.factor(Bad)))
p + facet_wrap( ~ variable, scales="free")

library(sjlabelled)
## 
## Attaching package: 'sjlabelled'
## The following object is masked from 'package:forcats':
## 
##     as_factor
## The following object is masked from 'package:ggplot2':
## 
##     as_label
## The following object is masked from 'package:dplyr':
## 
##     as_label
library(sjPlot)
sjp.corr(df_new[, -c(1:3), 18], show.legend = TRUE)+ 
  theme(axis.text.x=element_text(angle=90,
    hjust=0.95,vjust=0.2))+  
  labs(fill="Correlation coefficient")
## Warning: 'sjp.corr' is deprecated. Please use 'correlation::correlation()' and
## its related plot()-method.
## Computing correlation using pearson-method with listwise-deletion...
## Warning: Removed 120 rows containing missing values (`geom_text()`).

library(ppsr)
## Warning: package 'ppsr' was built under R version 4.2.3
library(correlationfunnel)
## Warning: package 'correlationfunnel' was built under R version 4.2.3
## ══ correlationfunnel Tip #3 ════════════════════════════════════════════════════
## Using `binarize()` with data containing many columns or many rows can increase dimensionality substantially.
## Try subsetting your data column-wise or row-wise to avoid creating too many columns.
## You can always make a big problem smaller by sampling. :)
## 
## Attaching package: 'correlationfunnel'
## The following object is masked from 'package:dlookr':
## 
##     correlate

check for predictive power score

df_new$Bad <- as.factor(df_new$Bad)
ppwr <- df_new %>% score_predictors(y = "Bad", do_parallel = TRUE) %>% as_tibble()
ppwr %>% glimpse()
## Rows: 18
## Columns: 11
## $ x              <chr> "MOB", "ExtStatus", "IntStatus", "DaysDeliq", "ActualMi…
## $ y              <chr> "Bad", "Bad", "Bad", "Bad", "Bad", "Bad", "Bad", "Bad",…
## $ result_type    <chr> "predictor is constant", "predictive power score", "pre…
## $ pps            <dbl> 0.0000000, 0.2027755, 0.4909950, 0.4853235, 0.4813707, …
## $ metric         <chr> NA, "F1_weighted", "F1_weighted", "F1_weighted", "F1_we…
## $ baseline_score <dbl> NA, 0.4924155, 0.4924155, 0.4924155, 0.4924155, 0.49241…
## $ model_score    <dbl> NA, 0.5390922, 0.6793605, 0.6813691, 0.6786751, 0.67562…
## $ cv_folds       <dbl> NA, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, 5, NA
## $ seed           <dbl> NA, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, NA
## $ algorithm      <chr> NA, "tree", "tree", "tree", "tree", "tree", "tree", "tr…
## $ model_type     <chr> NA, "classification", "classification", "classification…
df_new %>% visualize_pps(y = "Bad", do_parallel = TRUE)

df_binnarise <- df_new %>%
  binarize(n_bins = 5, thresh_infreq = 0.01, name_infreq = "OTHER", one_hot = TRUE)
df_binnarise %>% glimpse()
## Rows: 2,945
## Columns: 74
## $ ExtStatus__                              <dbl> 1, 1, 1, 0, 1, 1, 1, 0, 0, 1,…
## $ ExtStatus__C                             <dbl> 0, 0, 0, 1, 0, 0, 0, 0, 0, 0,…
## $ ExtStatus__F                             <dbl> 0, 0, 0, 0, 0, 0, 0, 1, 1, 0,…
## $ ExtStatus__OTHER                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ IntStatus__                              <dbl> 1, 1, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ IntStatus__D                             <dbl> 0, 0, 0, 1, 0, 0, 0, 0, 0, 0,…
## $ IntStatus__O                             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ IntStatus__X                             <dbl> 0, 0, 1, 0, 1, 1, 1, 1, 1, 1,…
## $ IntStatus__OTHER                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ DaysDeliq__0                             <dbl> 1, 1, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ DaysDeliq__30                            <dbl> 0, 0, 0, 0, 1, 1, 0, 0, 0, 0,…
## $ DaysDeliq__31                            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ DaysDeliq__60                            <dbl> 0, 0, 1, 0, 0, 0, 1, 0, 0, 0,…
## $ DaysDeliq__61                            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 1,…
## $ DaysDeliq__90                            <dbl> 0, 0, 0, 1, 0, 0, 0, 1, 1, 0,…
## $ DaysDeliq__91                            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ `ActualMinPay__-Inf_30`                  <dbl> 1, 1, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ ActualMinPay__30_51                      <dbl> 0, 0, 0, 0, 1, 0, 0, 0, 0, 0,…
## $ ActualMinPay__51_90                      <dbl> 0, 0, 1, 0, 0, 1, 1, 0, 0, 1,…
## $ ActualMinPay__90_Inf                     <dbl> 0, 0, 0, 1, 0, 0, 0, 1, 1, 0,…
## $ `OverlimitAmount__-Inf_9.27600000000001` <dbl> 1, 1, 0, 1, 0, 0, 0, 0, 0, 0,…
## $ OverlimitAmount__9.27600000000001_76.604 <dbl> 0, 0, 1, 0, 1, 1, 0, 0, 0, 0,…
## $ OverlimitAmount__76.604_Inf              <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 1, 1,…
## $ `DisplayMinPay__-Inf_30`                 <dbl> 1, 1, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ DisplayMinPay__30_32                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ DisplayMinPay__32_60                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ DisplayMinPay__60_168.064                <dbl> 0, 0, 1, 1, 1, 1, 0, 0, 0, 0,…
## $ DisplayMinPay__168.064_Inf               <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 1, 1,…
## $ `OpeningBalance__-Inf_206.91`            <dbl> 1, 0, 0, 1, 0, 0, 0, 0, 0, 0,…
## $ OpeningBalance__206.91_287.736           <dbl> 0, 1, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ OpeningBalance__287.736_336.92           <dbl> 0, 0, 1, 0, 1, 1, 1, 0, 0, 0,…
## $ OpeningBalance__336.92_506.266000000001  <dbl> 0, 0, 0, 0, 0, 0, 0, 1, 1, 1,…
## $ OpeningBalance__506.266000000001_Inf     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ BillLateCharge__0                        <dbl> 1, 1, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ BillLateCharge__25                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ BillLateCharge__30                       <dbl> 0, 0, 0, 0, 0, 1, 0, 0, 0, 0,…
## $ BillLateCharge__35                       <dbl> 0, 0, 1, 1, 1, 0, 1, 1, 1, 1,…
## $ BillLateCharge__OTHER                    <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ `EndingBalance__-Inf_241.448`            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ EndingBalance__241.448_303.67            <dbl> 1, 1, 0, 1, 0, 0, 0, 0, 0, 0,…
## $ EndingBalance__303.67_377.228            <dbl> 0, 0, 1, 0, 1, 1, 0, 0, 0, 0,…
## $ EndingBalance__377.228_545.364           <dbl> 0, 0, 0, 0, 0, 0, 1, 1, 1, 1,…
## $ EndingBalance__545.364_Inf               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ CreditLimit__300                         <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1,…
## $ CreditLimit__400                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ CreditLimit__700                         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ CreditLimit__OTHER                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ `TotalNetPayments__-Inf_0`               <dbl> 0, 0, 1, 1, 0, 1, 1, 1, 1, 1,…
## $ TotalNetPayments__0_46                   <dbl> 1, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ TotalNetPayments__46_97.0760000000001    <dbl> 0, 0, 0, 0, 1, 0, 0, 0, 0, 0,…
## $ TotalNetPayments__97.0760000000001_Inf   <dbl> 0, 1, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ `TotalNetPurchaseAndCash__-Inf_0`        <dbl> 0, 0, 1, 1, 0, 0, 1, 1, 1, 1,…
## $ TotalNetPurchaseAndCash__0_32.338        <dbl> 0, 0, 0, 0, 1, 1, 0, 0, 0, 0,…
## $ TotalNetPurchaseAndCash__32.338_102.234  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ TotalNetPurchaseAndCash__102.234_Inf     <dbl> 1, 1, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ `TotalFeesBilled__-Inf_7.918`            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ TotalFeesBilled__7.918_14.664            <dbl> 1, 1, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ TotalFeesBilled__14.664_35.988           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ TotalFeesBilled__35.988_46.27            <dbl> 0, 0, 1, 1, 0, 1, 0, 0, 0, 0,…
## $ TotalFeesBilled__46.27_Inf               <dbl> 0, 0, 0, 0, 1, 0, 1, 1, 1, 1,…
## $ `Concessions__-Inf_0`                    <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1,…
## $ Concessions__0_Inf                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ `QuarterlyCreditScore__-Inf_517`         <dbl> 0, 0, 0, 1, 1, 0, 1, 0, 1, 1,…
## $ QuarterlyCreditScore__517_561            <dbl> 1, 1, 1, 0, 0, 0, 0, 0, 0, 0,…
## $ QuarterlyCreditScore__561_599            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ QuarterlyCreditScore__599_635            <dbl> 0, 0, 0, 0, 0, 1, 0, 0, 0, 0,…
## $ QuarterlyCreditScore__635_Inf            <dbl> 0, 0, 0, 0, 0, 0, 0, 1, 0, 0,…
## $ `Bscore__-Inf_538.8`                     <dbl> 0, 0, 0, 1, 0, 0, 1, 1, 1, 1,…
## $ Bscore__538.8_605                        <dbl> 0, 0, 1, 0, 1, 1, 0, 0, 0, 0,…
## $ Bscore__605_633                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ Bscore__633_655                          <dbl> 1, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ Bscore__655_Inf                          <dbl> 0, 1, 0, 0, 0, 0, 0, 0, 0, 0,…
## $ Bad__0                                   <dbl> 1, 1, 0, 0, 1, 1, 0, 0, 0, 0,…
## $ Bad__1                                   <dbl> 0, 0, 1, 1, 0, 0, 1, 1, 1, 1,…
df_corr_tbl <- df_binnarise %>%
  correlate(Bad__1) %>% plot_correlation_funnel()
df_corr_tbl

# combine the test with the probabilities

aftermodel_df <- cbind(test, logitmod1_cart1)
head(aftermodel_df)
aftermodel_df1 <- aftermodel_df[, -c(17,18,19,21)]
aftermodeldf_binnarise <- aftermodel_df1 %>%
  binarize(n_bins = 5, thresh_infreq = 0.01, name_infreq = "OTHER", one_hot = TRUE)
aftermodeldf_binnarise %>% glimpse()
## Rows: 1,177
## Columns: 75
## $ ExtStatus__                            <dbl> 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 0…
## $ ExtStatus__C                           <dbl> 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ ExtStatus__F                           <dbl> 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 1…
## $ ExtStatus__OTHER                       <dbl> 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0…
## $ IntStatus__                            <dbl> 1, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0…
## $ IntStatus__D                           <dbl> 0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ IntStatus__O                           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0…
## $ IntStatus__X                           <dbl> 0, 0, 1, 1, 1, 1, 0, 1, 0, 0, 1…
## $ IntStatus__OTHER                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ DaysDeliq__0                           <dbl> 1, 0, 0, 0, 0, 0, 1, 0, 1, 1, 0…
## $ DaysDeliq__30                          <dbl> 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0…
## $ DaysDeliq__31                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ DaysDeliq__60                          <dbl> 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 0…
## $ DaysDeliq__61                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ DaysDeliq__90                          <dbl> 0, 1, 0, 0, 0, 1, 0, 1, 0, 0, 0…
## $ DaysDeliq__91                          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1…
## $ `ActualMinPay__-Inf_30`                <dbl> 1, 0, 0, 0, 0, 0, 1, 0, 1, 1, 0…
## $ ActualMinPay__30_51                    <dbl> 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0…
## $ ActualMinPay__51_90                    <dbl> 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0…
## $ ActualMinPay__90_Inf                   <dbl> 0, 1, 0, 0, 0, 1, 0, 1, 0, 0, 1…
## $ `OverlimitAmount__-Inf_11.046`         <dbl> 1, 1, 0, 0, 0, 0, 1, 0, 1, 1, 0…
## $ OverlimitAmount__11.046_77.348         <dbl> 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0…
## $ OverlimitAmount__77.348_Inf            <dbl> 0, 0, 0, 0, 1, 1, 0, 1, 0, 0, 1…
## $ `DisplayMinPay__-Inf_30`               <dbl> 1, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0…
## $ DisplayMinPay__30_35.648               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0…
## $ DisplayMinPay__35.648_60.834           <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0…
## $ DisplayMinPay__60.834_169.02           <dbl> 0, 1, 1, 1, 0, 0, 0, 0, 0, 0, 0…
## $ DisplayMinPay__169.02_Inf              <dbl> 0, 0, 0, 0, 1, 1, 0, 1, 0, 0, 1…
## $ `OpeningBalance__-Inf_222.368`         <dbl> 1, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0…
## $ OpeningBalance__222.368_296.782        <dbl> 0, 0, 0, 1, 0, 0, 0, 0, 0, 1, 0…
## $ OpeningBalance__296.782_341.214        <dbl> 0, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0…
## $ OpeningBalance__341.214_562.64         <dbl> 0, 0, 0, 0, 0, 1, 0, 1, 0, 0, 1…
## $ OpeningBalance__562.64_Inf             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ BillLateCharge__0                      <dbl> 1, 0, 0, 0, 0, 0, 1, 0, 1, 1, 0…
## $ BillLateCharge__25                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ BillLateCharge__30                     <dbl> 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0…
## $ BillLateCharge__35                     <dbl> 0, 1, 1, 0, 1, 1, 0, 1, 0, 0, 1…
## $ BillLateCharge__OTHER                  <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ `EndingBalance__-Inf_247.246`          <dbl> 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 0…
## $ EndingBalance__247.246_307.488         <dbl> 1, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0…
## $ EndingBalance__307.488_379.578         <dbl> 0, 0, 1, 1, 0, 0, 0, 0, 1, 0, 0…
## $ EndingBalance__379.578_556.114         <dbl> 0, 0, 0, 0, 1, 1, 0, 1, 0, 0, 1…
## $ EndingBalance__556.114_Inf             <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ CreditLimit__300                       <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1…
## $ CreditLimit__400                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ CreditLimit__700                       <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ CreditLimit__OTHER                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ `TotalNetPayments__-Inf_0`             <dbl> 0, 1, 0, 1, 1, 1, 0, 1, 0, 0, 1…
## $ TotalNetPayments__0_10.2               <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ TotalNetPayments__10.2_47              <dbl> 1, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0…
## $ TotalNetPayments__47_90                <dbl> 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 0…
## $ TotalNetPayments__90_Inf               <dbl> 0, 0, 0, 0, 0, 0, 1, 0, 1, 0, 0…
## $ `TotalNetPurchaseAndCash__-Inf_0`      <dbl> 0, 1, 0, 0, 1, 1, 0, 1, 0, 0, 1…
## $ TotalNetPurchaseAndCash__0_30.204      <dbl> 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0…
## $ TotalNetPurchaseAndCash__30.204_99.656 <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0…
## $ TotalNetPurchaseAndCash__99.656_Inf    <dbl> 1, 0, 0, 0, 0, 0, 1, 0, 1, 0, 0…
## $ `TotalFeesBilled__-Inf_8.14`           <dbl> 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0…
## $ TotalFeesBilled__8.14_17.412           <dbl> 1, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0…
## $ TotalFeesBilled__17.412_36.566         <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ TotalFeesBilled__36.566_46.318         <dbl> 0, 1, 0, 1, 0, 0, 0, 0, 0, 0, 1…
## $ TotalFeesBilled__46.318_Inf            <dbl> 0, 0, 1, 0, 1, 1, 0, 1, 0, 0, 0…
## $ `Concessions__-Inf_0`                  <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1…
## $ Concessions__0_Inf                     <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ `QuarterlyCreditScore__-Inf_519`       <dbl> 0, 1, 1, 0, 1, 1, 1, 1, 0, 1, 0…
## $ QuarterlyCreditScore__519_559          <dbl> 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ QuarterlyCreditScore__559_599          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1…
## $ QuarterlyCreditScore__599_637          <dbl> 0, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0…
## $ QuarterlyCreditScore__637_Inf          <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0…
## $ `Bscore__-Inf_538`                     <dbl> 0, 1, 0, 0, 1, 1, 0, 1, 0, 0, 1…
## $ Bscore__538_604                        <dbl> 0, 0, 1, 1, 0, 0, 0, 0, 1, 0, 0…
## $ Bscore__604_632                        <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0…
## $ Bscore__632_652                        <dbl> 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0…
## $ Bscore__652_Inf                        <dbl> 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0…
## $ Predicted__No                          <dbl> 1, 0, 0, 0, 0, 0, 1, 0, 1, 1, 0…
## $ Predicted__Yes                         <dbl> 0, 1, 1, 1, 1, 1, 0, 1, 0, 0, 1…
aftermodeldf_corr_tbl <- aftermodeldf_binnarise %>%
  correlate(Predicted__Yes) %>% plot_correlation_funnel()
aftermodeldf_corr_tbl

#loss or the chargeoff

aftermodel_df2 <- aftermodel_df %>% filter(bad == "Yes") #filter to select only bad customers
# chargeoffdollars == EndingBalance on last statement

chargeoffdollars <- aftermodel_df2$EndingBalance
aftermodel_df2$chargeoffdollars <- chargeoffdollars
head(aftermodel_df2)
logisticntiles <- scores_and_ntiles %>% filter(model_label == "logistic") %>% filter(dataset_label == "test data") %>% filter(y_true == "Yes")
head(logisticntiles)
#combine data with ntiles

ntiles <- logisticntiles[, c(6,7)]
aftermodel_df3 <- cbind(aftermodel_df2, ntiles)
head(aftermodel_df3)
qplot(aftermodel_df3$ntl_Yes,aftermodel_df3$chargeoffdollars, geom='smooth', span =0.5)
## Warning: `qplot()` was deprecated in ggplot2 3.4.0.
## `geom_smooth()` using method = 'loess' and formula = 'y ~ x'

head(aftermodel_df3)