Utility Functions
strict_regex <- function(kwds, texts){
#Create a list to store results
tmpList <- list()
#Loop through all keywords
for (i in 1:length(kwds)){
#Store results as a logical vector in its respective list entry position
tmpList[[i]] <- grepl(kwds[i], texts, ignore.case = TRUE)
}
#Return list and control to environment
return(tmpList)
}
to_df <- function(domain, rule){
#Convert list from grepl to data frame
domain <- as.data.frame(domain)
#Show column names as phrases
colnames(domain) <- rule[rule != '']
#Multiply by 1 for binary numeric
domain <- domain*1
return(domain)
}
clean_text <- function(tokens){
#Remove carriage returns, convert to lower
tokens <- tolower(gsub('\n', ' ', tokens))
#https://stackoverflow.com/questions/13529360/replace-text-within-parenthesis-in-r
#Remove obfuscations between '[' and ']'
tokens <- gsub(" *\\[.*?\\] *", ' ', tokens)
#Keep only words & numeric
tokens <- gsub("[^[:alnum:][:space:]]", '', tokens)
#Keep only a single white space
#https://stackoverflow.com/questions/25707647/merge-multiple-spaces-to-single-space-remove-trailing-leading-spaces
tokens <- gsub("(?<=[\\s])\\s*|^\\s+|\\s+$", '', tokens, perl=TRUE)
return(tokens)
}
bow <- function(phrases){
tmp <- unlist(strsplit(phrases, ' '))
tmp <- tmp[tmp != '']
return(tmp)
}
plot_bow <- function(bows, n, lab, tabulate){
if (tabulate){
tmp_tab <- table(bows)[rev(order(table(bows)))]
} else {
tmp_tab <- bows
}
par(mai=c(1,2,1,1))
barplot(rev(head(tmp_tab, n)), horiz = T, las = 1,
main = paste("Most Frequent Words in the ",lab ," Dictionary", sep = ''),
xlab = "Frequency")
}
bow_subset <- function(bows, n){
#Make an ordered table
tmp_tab <- table(bows)[rev(order(table(bows)))]
#print(head(tmp_tab))
#Percent calculation
perc <- length(tmp_tab)*(n/100)
#print(perc)
#Return top n represented values
#return(attr(head(tmp_tab, perc), "names"))
return(head(tmp_tab, perc))
}
check_variance <- function(dat){
##Remove columns if they have no variance
for (name in colnames(dat)){
if (all(dat[[name]] == 1) | all (dat[[name]] == 0)){
cat(paste("\"",name, "\" has no variance and will be dropped.\n", sep = ''))
dat[[name]] <- NULL
}
}
return(dat)
}
model_info <- function(fit){
#Summary info
model_sum <- summary(fit)
#Odds ratio, confidence interval
odds_ratio <- cbind(OR = exp(fit$coef), exp(confint(fit)))
#Create list for return
my_list <- list(model_sum, odds_ratio)
#names
names(my_list) <- c("Model Summary","OR Summary")
return(my_list)
}
confusion_data <- function(fit){
#Create variables
accuracy <- vector()
#Threshold sequence
threshold <- seq(0.1,0.9, by=.01)
for (i in 1:length(threshold)){
#Accuracy calculation from confusion matrix
accuracy[i] <- Conf(fit, cutoff = threshold[i])$acc
}
#Confusion matrix
cutoff <- threshold[which.max(accuracy)]
conf_mat <- Conf(fit, cutoff = cutoff)
cat("Maximum accuracy is acheived at a cutoff of: ", cutoff, '\n', sep = '')
#Plot
layout(matrix(1:2,ncol = 2))
plot(threshold, accuracy, type = "l", main = "Cutoff Based on Accuracy")
abline(h=max(accuracy), v = cutoff, col="red")
fourfoldplot(conf_mat$table, main = "Confusion Matrix Plot",
color = c("red","green"))
return(conf_mat)
}
dat$cln_txt <- clean_text(dat$comment_text)
## [1] "id" "comment_text" "toxic" "severe_toxic"
## [5] "obscene" "threat" "insult" "identity_hate"
txt_bow <- bow(dat$cln_txt)
length(txt_bow)
## [1] 10539247
length(unique(txt_bow))
## [1] 248659
tox_bow <- bow(dat$cln_txt[dat$toxic == 1])
length(tox_bow)
## [1] 774478
length(unique(tox_bow))
## [1] 37509
stx_bow <- bow(dat$cln_txt[dat$severe_toxic == 1])
length(stx_bow)
## [1] 119891
length(unique(stx_bow))
## [1] 6335
obs_bow <- bow(dat$cln_txt[dat$obscene == 1])
length(obs_bow)
## [1] 414435
length(unique(obs_bow))
## [1] 24021
thr_bow <- bow(dat$cln_txt[dat$threat == 1])
length(thr_bow)
## [1] 26254
length(unique(thr_bow))
## [1] 3102
ins_bow <- bow(dat$cln_txt[dat$insult == 1])
length(ins_bow)
## [1] 376667
length(unique(ins_bow))
## [1] 22355
idn_bow <- bow(dat$cln_txt[dat$identity_hate == 1])
length(idn_bow)
## [1] 72455
length(unique(idn_bow))
## [1] 7786
plot_bow(txt_bow, 20, "Entire", T)

plot_bow(tox_bow, 20, "Toxic", T)

plot_bow(stx_bow, 20, "Severe Toxic", T)

plot_bow(obs_bow, 20, "Obscene", T)

plot_bow(thr_bow, 20, "Threat", T)

plot_bow(ins_bow, 20, "Insult", T)

plot_bow(idn_bow, 20, "Identity Hate", T)

Subset and remove top tokens, plot again
#Top non-specific tokens from all texts
txt_bow <- bow_subset(txt_bow, 0.2)
#Clean non-specific tokens from phrase dictionaries
tox_bow <- tox_bow[!tox_bow %in% names(txt_bow)]
stx_bow <- stx_bow[!stx_bow %in% names(txt_bow)]
obs_bow <- obs_bow[!obs_bow %in% names(txt_bow)]
thr_bow <- thr_bow[!thr_bow %in% names(txt_bow)]
ins_bow <- ins_bow[!ins_bow %in% names(txt_bow)]
idn_bow <- idn_bow[!idn_bow %in% names(txt_bow)]
#Subset top tokens in each phrase dictionary
tox_bow <- bow_subset(tox_bow, 2)
stx_bow <- bow_subset(stx_bow, 2)
obs_bow <- bow_subset(obs_bow, 2)
thr_bow <- bow_subset(thr_bow, 2)
ins_bow <- bow_subset(ins_bow, 2)
idn_bow <- bow_subset(idn_bow, 2)
plot_bow(txt_bow, 20, "Entire", F)

plot_bow(tox_bow, 20, "Toxic", F)

plot_bow(stx_bow, 20, "Severe Toxic", F)

plot_bow(obs_bow, 20, "Obscene", F)

plot_bow(thr_bow, 20, "Threat", F)

plot_bow(ins_bow, 20, "Insult", F)

plot_bow(idn_bow, 20, "Identity Hate", F)

## Drop frequency data
txt_bow <- names(txt_bow)
tox_bow <- names(tox_bow)
stx_bow <- names(stx_bow)
obs_bow <- names(obs_bow)
thr_bow <- names(thr_bow)
ins_bow <- names(ins_bow)
idn_bow <- names(idn_bow)
Run Regex
tox_tmp <- strict_regex(tox_bow, dat$cln_txt)
stx_tmp <- strict_regex(stx_bow, dat$cln_txt)
obs_tmp <- strict_regex(obs_bow, dat$cln_txt)
thr_tmp <- strict_regex(thr_bow, dat$cln_txt)
ins_tmp <- strict_regex(ins_bow, dat$cln_txt)
idn_tmp <- strict_regex(idn_bow, dat$cln_txt)
#Convert list to data.frame
tox_tmp <- to_df(tox_tmp, tox_bow)
stx_tmp <- to_df(stx_tmp, stx_bow)
obs_tmp <- to_df(obs_tmp, obs_bow)
thr_tmp <- to_df(thr_tmp, thr_bow)
ins_tmp <- to_df(ins_tmp, ins_bow)
idn_tmp <- to_df(idn_tmp, idn_bow)
Check variance and prepare for regression
#Check variance
tox_tmp <- check_variance(tox_tmp)
stx_tmp <- check_variance(stx_tmp)
obs_tmp <- check_variance(obs_tmp)
thr_tmp <- check_variance(thr_tmp)
ins_tmp <- check_variance(ins_tmp)
idn_tmp <- check_variance(idn_tmp)
#Add Labels
tox_tmp <- cbind(dat$toxic, tox_tmp)
colnames(tox_tmp)[1] <- "toxic"
stx_tmp <- cbind(dat$severe_toxic, stx_tmp)
colnames(stx_tmp)[1] <- "severe_toxic"
obs_tmp <- cbind(dat$obscene, obs_tmp)
colnames(obs_tmp)[1] <- "obscene"
thr_tmp <- cbind(dat$threat, thr_tmp)
colnames(thr_tmp)[1] <- "threat"
ins_tmp <- cbind(dat$insult, ins_tmp)
colnames(ins_tmp)[1] <- "insult"
idn_tmp <- cbind(dat$identity_hate, idn_tmp)
colnames(idn_tmp)[1] <- "identity_hate"
Regression
#Toxic
tox_reg <- glm(toxic ~ ., family = binomial(link = 'logit'), data = tox_tmp)
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
#Severe Toxic
stx_reg <- glm(severe_toxic ~ ., family = binomial(link = 'logit'), data = stx_tmp)
#Obscene
obs_reg <- glm(obscene ~ ., family = binomial(link = 'logit'), data = obs_tmp)
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
#Threat
thr_reg <- glm(threat ~ ., family = binomial(link = 'logit'), data = thr_tmp)
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
#Insult
ins_reg <- glm(insult ~ ., family = binomial(link = 'logit'), data = ins_tmp)
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
#Identity hate
idn_reg <- glm(identity_hate ~ ., family = binomial(link = 'logit'), data = idn_tmp)
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
Summary
summary(tox_reg)
##
## Call:
## glm(formula = toxic ~ ., family = binomial(link = "logit"), data = tox_tmp)
##
## Deviance Residuals:
## Min 1Q Median 3Q Max
## -6.5135 -0.2970 -0.1767 -0.0790 5.1887
##
## Coefficients: (3 not defined because of singularities)
## Estimate Std. Error z value
## (Intercept) -1.425e+00 8.020e-02 -17.769
## fat 8.179e-01 1.125e-01 7.268
## faggot 1.154e+00 3.033e-01 3.806
## moron 2.924e+00 1.646e-01 17.766
## cunt 3.560e+00 1.881e-01 18.929
## sucks 3.927e+00 2.118e-01 18.543
## stupid 3.351e+00 8.615e-02 38.898
## bitch 4.224e+00 1.630e-01 25.923
## pig 1.504e+00 1.882e-01 7.991
## jew 1.490e+00 2.005e-01 7.430
## dick 3.683e+00 1.223e-01 30.112
## bullshit 1.556e+00 1.686e-01 9.230
## wanker 3.581e+00 3.488e-01 10.267
## fag 3.237e+00 1.768e-01 18.304
## bark -1.036e+00 8.002e-01 -1.294
## balls 2.421e+00 2.133e-01 11.352
## asshole 4.116e+00 2.054e-01 20.034
## sex 1.830e+00 1.310e-01 13.970
## cock 2.775e+00 1.597e-01 17.377
## piece 9.013e-01 1.331e-01 6.774
## nipple 2.799e-01 7.431e-01 0.377
## penis 3.553e+00 1.846e-01 19.241
## kill 1.391e+00 1.070e-01 12.991
## hell 6.880e-01 6.532e-02 10.532
## aids 1.174e+00 3.097e-01 3.792
## dickhead 2.865e-02 4.069e-01 0.070
## bastard 3.748e+00 2.123e-01 17.652
## fucker 5.352e+00 5.240e-01 10.213
## shut 2.628e+00 1.347e-01 19.509
## eat -2.516e-01 5.336e-02 -4.714
## faggots -8.324e-01 5.562e-01 -1.497
## idiot 4.316e+00 1.191e-01 36.241
## damn 1.905e+00 1.338e-01 14.236
## loser 2.407e+00 1.702e-01 14.141
## fucksex 1.077e+01 1.455e+03 0.007
## yourselfgo 1.658e+01 1.009e+03 0.016
## rape 8.080e-01 1.829e-01 4.419
## homo 1.644e+00 2.117e-01 7.764
## huge 6.476e-02 2.261e-01 0.286
## cocksucker 2.758e+00 1.153e+00 2.391
## super -6.961e-01 2.277e-01 -3.058
## ban 3.493e-01 9.052e-02 3.858
## poop 2.639e+00 3.052e-01 8.646
## god 3.607e-01 1.120e-01 3.220
## buttsecks 1.705e+01 1.018e+03 0.017
## dog 7.438e-01 1.556e-01 4.780
## mothjer 5.469e+00 6.509e+02 0.008
## mother 1.146e+00 1.663e-01 6.890
## fggt 3.345e+00 7.661e-01 4.367
## hitler -9.365e-01 2.007e-01 -4.665
## noobs 3.366e+00 8.530e-01 3.946
## youi 5.622e-01 5.512e-01 1.020
## pussy 3.386e+00 3.070e-01 11.030
## admins 1.369e-01 1.223e-01 1.119
## guys 1.815e-01 1.619e-01 1.121
## bush 3.091e-01 2.872e-01 1.076
## banned 1.333e-01 1.489e-01 0.895
## anal 5.828e-01 1.642e-01 3.550
## d -1.887e-01 4.071e-02 -4.635
## heil 1.475e+00 5.163e-01 2.857
## dumb 2.501e+00 1.527e-01 16.380
## boobs 2.821e+00 5.850e-01 4.823
## mexicans 1.119e+00 6.672e-01 1.677
## fuckin 4.933e+00 1.523e-01 32.391
## crap 2.307e+00 1.050e-01 21.963
## offfuck 1.689e+01 1.455e+03 0.012
## retarded -4.924e-01 3.278e-01 -1.502
## proassadhanibal911youre 1.439e+01 8.403e+02 0.017
## niggas 1.321e-01 1.302e+00 0.101
## ur -5.738e-02 3.007e-02 -1.908
## bollocks 1.021e-01 9.020e-01 0.113
## ha -4.668e-01 2.863e-02 -16.304
## cocks 3.814e-01 5.030e-01 0.758
## racist 1.986e+00 1.182e-01 16.794
## nice -3.260e-01 1.211e-01 -2.692
## bitchesfuck 1.340e+01 1.455e+03 0.009
## sexsex 1.476e+00 2.021e+00 0.731
## pathetic 2.438e+00 1.442e-01 16.911
## useless 4.818e-01 2.193e-01 2.197
## power 1.102e-02 1.267e-01 0.087
## hes -3.490e-01 6.518e-02 -5.354
## sexual -5.437e-01 2.210e-01 -2.460
## youfuck 1.712e+01 4.816e+02 0.036
## alone 7.462e-01 1.137e-01 6.564
## bitchfuck 1.139e+01 1.110e+03 0.010
## notrhbysouthbanof 1.137e+01 8.403e+02 0.014
## lick -1.273e-02 1.738e-01 -0.073
## deleting 4.431e-01 1.204e-01 3.681
## cocksucking 7.421e+00 1.505e+02 0.049
## guy 1.030e-01 1.106e-01 0.932
## oxymoron -1.544e+00 7.882e-01 -1.959
## live 2.061e-01 1.075e-01 1.917
## criminalwar 3.102e+00 1.459e+03 0.002
## bunksteve 1.792e+01 1.455e+03 0.012
## assfuck 5.159e+00 6.853e+00 0.753
## yeah 3.337e-01 1.184e-01 2.817
## seriously 7.334e-01 2.043e-01 3.590
## bot -4.182e-01 9.308e-02 -4.493
## chester 9.559e-02 5.268e-01 0.181
## truth -1.435e-01 1.187e-01 -1.209
## romney 7.993e-01 1.116e+00 0.716
## mitt -5.428e-01 1.952e-01 -2.780
## marcolfuck 1.766e+01 1.455e+03 0.012
## cunts 4.407e-02 5.866e-01 0.075
## head 4.880e-01 9.180e-02 5.316
## nazi 1.665e+00 1.402e-01 11.872
## bum -4.998e-01 2.020e-01 -2.475
## penissmall 1.387e+01 1.455e+03 0.010
## gonna 9.195e-01 1.520e-01 6.048
## dirty 2.279e+00 2.258e-01 10.091
## bloody 1.297e+00 3.047e-01 4.257
## whatever 2.645e-01 1.231e-01 2.149
## everyone -4.344e-01 1.248e-01 -3.480
## loves 5.425e-01 2.839e-01 1.911
## homeland 8.429e-01 6.061e-01 1.391
## arse 1.753e+00 1.931e-01 9.077
## fack 6.135e+00 1.609e+00 3.813
## smells 2.131e+00 4.950e-01 4.305
## tommy2010 2.111e+00 1.206e+00 1.750
## securityfuck 1.755e+01 1.455e+03 0.012
## stuff 1.388e-01 1.165e-01 1.191
## cuntbag 1.127e+01 4.826e+02 0.023
## vomit 5.202e-01 7.271e-01 0.715
## face 6.058e-01 1.149e-01 5.273
## fun -7.270e-02 1.222e-01 -0.595
## f 5.419e-02 3.237e-02 1.674
## internet 1.218e-01 1.451e-01 0.839
## wales -1.421e-01 2.977e-01 -0.477
## spanish -6.322e-01 3.454e-01 -1.830
## sick 1.862e+00 1.493e-01 12.474
## youbollocks 1.616e+01 1.455e+03 0.011
## takes -8.232e-01 1.984e-01 -4.150
## basteredbastered 1.787e+01 1.455e+03 0.012
## guess 1.904e-01 1.166e-01 1.633
## fartchina 1.581e+01 1.455e+03 0.011
## jews -7.805e-01 2.484e-01 -3.142
## white -2.072e+00 1.526e-01 -13.578
## veggietales 6.573e-02 2.827e+00 0.023
## proof 4.786e-01 1.481e-01 3.232
## talking 5.845e-02 1.202e-01 0.486
## job 3.141e-01 1.256e-01 2.501
## everything -8.049e-02 1.318e-01 -0.611
## whore 3.094e+00 3.135e-01 9.871
## ancestryfuckoffjewish 1.747e+01 1.455e+03 0.012
## useredgar181 1.073e+00 1.198e+00 0.895
## egg 3.449e-02 2.981e-01 0.116
## black 9.092e-01 2.185e-01 4.161
## dude 1.031e+00 1.373e-01 7.505
## full 3.726e-02 9.329e-02 0.399
## idiots -9.212e-01 2.130e-01 -4.325
## cheese -8.433e-01 4.717e-01 -1.788
## robert -1.297e+00 4.727e-01 -2.743
## atheist 1.009e-02 3.921e-01 0.026
## ya 5.702e-02 8.068e-02 0.707
## calling -2.434e-01 1.428e-01 -1.704
## vagina 2.602e+00 3.310e-01 7.859
## fire 1.816e-01 2.027e-01 0.896
## anthony 1.127e-01 5.145e-01 0.219
## obviously 3.194e-01 2.139e-01 1.493
## chicken 5.387e-01 3.824e-01 1.409
## sucku 3.138e+00 1.114e+00 2.817
## licker 1.667e+00 7.754e-01 2.149
## jerk 2.994e+00 1.712e-01 17.489
## blocking 4.018e-01 1.420e-01 2.830
## whats 1.091e-01 1.167e-01 0.934
## havent -1.628e-01 1.603e-01 -1.016
## fool 1.535e+00 1.387e-01 11.069
## ugly 2.181e+00 2.108e-01 10.346
## ignorant 1.895e+00 1.801e-01 10.525
## ullmann 7.340e-01 3.485e+00 0.211
## jdelanoy 2.923e+00 9.942e-01 2.941
## bradbury -1.889e+00 5.820e+00 -0.325
## hard -3.832e-01 1.167e-01 -3.285
## lies 1.194e+00 1.276e-01 9.353
## son -2.357e-01 4.958e-02 -4.754
## shitfuck 1.024e+01 4.248e+02 0.024
## sad 2.282e-01 1.239e-01 1.842
## nigga 3.982e+00 4.535e-01 8.779
## arent 9.597e-02 1.251e-01 0.767
## unblock -4.167e-01 1.481e-01 -2.814
## bunch 6.992e-01 1.800e-01 3.884
## fan1967 2.618e+00 1.372e+00 1.908
## centraliststupid 1.547e+01 1.455e+03 0.011
## terrorists 7.666e-02 4.043e-01 0.190
## fired -8.473e-01 6.551e-01 -1.293
## usernhrhs2010 1.646e+01 8.403e+02 0.020
## death 1.993e-01 1.661e-01 1.200
## drink 1.057e+00 2.453e-01 4.308
## jim 2.319e-01 1.858e-01 1.248
## told 2.481e-01 1.371e-01 1.809
## reading -5.314e-01 1.669e-01 -3.185
## troll 6.301e-01 1.129e-01 5.581
## lmao 1.134e+00 3.773e-01 3.004
## joke 6.896e-01 1.361e-01 5.066
## stay 4.992e-02 1.270e-01 0.393
## mongo 1.178e-01 3.436e-01 0.343
## vandal 1.825e-01 6.672e-02 2.735
## reverting -5.137e-02 1.321e-01 -0.389
## mum 6.589e-01 2.215e-01 2.974
## piss 2.596e+00 1.892e-01 13.718
## cause -1.883e-02 5.173e-02 -0.364
## r -4.172e-01 4.989e-02 -8.362
## motherfucker 1.086e+00 1.316e+00 0.826
## ricehey -2.229e+00 4.910e+00 -0.454
## abusing 1.829e-01 2.878e-01 0.635
## wasnt -5.998e-01 1.520e-01 -3.947
## dare 1.310e+00 1.726e-01 7.586
## george -6.078e-01 3.003e-01 -2.024
## c 3.768e-02 3.679e-02 1.024
## bag 1.432e+00 1.766e-01 8.107
## ahead -2.174e-02 1.846e-01 -0.118
## scum 2.277e+00 2.361e-01 9.645
## nonsense 6.174e-01 1.306e-01 4.728
## game -3.776e-01 1.670e-01 -2.261
## quit -2.142e-02 1.039e-01 -0.206
## dumbass 1.782e+00 3.882e-01 4.590
## play -1.520e-01 1.144e-01 -1.329
## friends 4.274e-02 2.009e-01 0.213
## dead 1.953e-01 1.540e-01 1.268
## messages -5.335e-02 1.772e-01 -0.301
## o 1.315e-02 7.476e-02 0.176
## shall 2.023e-01 1.964e-01 1.030
## youll -2.366e-01 1.572e-01 -1.505
## mouth 1.292e+00 1.769e-01 7.301
## false 1.051e-01 1.407e-01 0.747
## completely 1.966e-01 2.375e-01 0.827
## wow 2.277e-01 1.539e-01 1.480
## gets 1.642e-01 1.556e-01 1.055
## bleachanhero 7.997e+00 1.455e+03 0.005
## ps -2.554e-01 5.984e-02 -4.268
## along -6.720e-01 1.882e-01 -3.570
## liar 9.164e-01 1.205e-01 7.607
## country 8.916e-02 1.569e-01 0.568
## boy 7.075e-01 1.101e-01 6.425
## aidsaids 1.611e+01 1.455e+03 0.011
## yo 1.029e+00 2.919e-02 35.249
## threats 1.126e+00 4.050e-01 2.779
## n -5.259e-01 5.188e-02 -10.136
## fucked 4.601e+00 3.050e-01 15.085
## act -4.013e-01 5.106e-02 -7.860
## murder 6.533e-01 1.936e-01 3.375
## listen 1.355e-01 1.612e-01 0.841
## bitches 2.728e-02 4.846e-01 0.056
## wikipedians -9.705e-03 2.438e-01 -0.040
## foolwhat 1.406e+01 1.455e+03 0.010
## fck 4.484e+00 4.157e-01 10.785
## bitchmattythewhite 1.285e+01 1.455e+03 0.009
## retard 3.077e+00 2.409e-01 12.774
## due -1.192e-01 1.601e-01 -0.744
## twat 2.095e+00 2.767e-01 7.571
## run -1.637e-01 1.159e-01 -1.412
## hairy 2.334e+00 7.236e-01 3.225
## goes -6.039e-01 1.916e-01 -3.152
## computer 4.412e-01 1.634e-01 2.700
## reported 1.023e-01 2.345e-01 0.436
## wanted -2.825e-01 1.391e-01 -2.031
## abuse 4.060e-01 1.459e-01 2.782
## posted -2.290e-01 1.543e-01 -1.483
## yours 5.330e-01 9.123e-02 5.842
## prick 2.293e+00 2.331e-01 9.839
## house -4.884e-01 2.064e-01 -2.366
## administrator 5.340e-01 1.481e-01 3.605
## shithole 1.602e+00 1.625e+00 0.986
## mr -7.559e-02 1.303e-01 -0.580
## jones -2.981e-01 5.188e-01 -0.575
## funny 1.320e-01 2.015e-01 0.655
## yaaaaah 9.654e+00 1.455e+03 0.007
## yaaa 4.276e-01 1.165e+00 0.367
## worthless 1.309e+00 3.172e-01 4.126
## telling 4.578e-01 1.632e-01 2.805
## self 1.384e-01 8.106e-02 1.707
## niggers 4.323e+00 4.908e-01 8.808
## human 7.005e-02 1.471e-01 0.476
## haahhahahah 2.098e+00 1.754e+00 1.196
## men -5.999e-01 4.631e-02 -12.954
## learn -8.398e-01 1.467e-01 -5.724
## king 1.095e-02 5.838e-02 0.187
## family -3.622e-01 1.965e-01 -1.843
## waste 4.833e-01 1.740e-01 2.777
## stick 6.391e-02 1.678e-01 0.381
## child 6.394e-01 1.469e-01 4.354
## biased 4.082e-01 2.215e-01 1.842
## administratorprick 1.547e+01 1.455e+03 0.011
## likes 1.242e+00 1.886e-01 6.585
## eats -6.537e-01 3.503e-01 -1.866
## coward 2.256e+00 2.315e-01 9.744
## cougar 2.900e+00 6.238e-01 4.649
## soon -1.938e-01 1.467e-01 -1.321
## posts 2.287e-01 1.808e-01 1.265
## peoples 1.662e-01 1.794e-01 0.927
## leaving -2.536e-01 2.476e-01 -1.024
## deal -5.360e-01 1.462e-01 -3.666
## watching 6.838e-02 2.883e-01 0.237
## report -2.615e-01 1.316e-01 -1.987
## complete -4.657e-01 1.823e-01 -2.555
## wouldnt -2.089e-01 1.627e-01 -1.284
## john -8.884e-01 1.927e-01 -4.610
## eyes 2.808e-01 2.119e-01 1.326
## business 5.965e-01 1.589e-01 3.755
## sock 2.821e-01 1.794e-01 1.573
## poor 6.193e-01 1.508e-01 4.107
## coming 1.443e-01 1.394e-01 1.035
## watch -4.002e-01 1.435e-01 -2.790
## chocobos 1.839e+01 9.413e+02 0.020
## writing -2.055e-01 1.484e-01 -1.384
## enjoy -9.698e-02 1.529e-01 -0.634
## dipshit 1.585e+00 4.690e-01 3.379
## california -1.354e-01 3.665e-01 -0.369
## butt 8.335e-01 1.411e-01 5.909
## tried -2.115e-01 1.635e-01 -1.293
## shitty 1.745e+00 4.738e-01 3.683
## ridiculous 1.184e+00 1.509e-01 7.842
## arrest 9.274e-01 3.918e-01 2.367
## `8dpenis` 1.425e+01 1.455e+03 0.010
## respect -4.477e-01 1.515e-01 -2.956
## evil 9.549e-01 1.619e-01 5.898
## nobody -1.650e-02 1.831e-01 -0.090
## lets -3.569e-01 1.458e-01 -2.448
## entire -4.636e-01 1.474e-01 -3.145
## douche 2.089e+00 2.425e-01 8.616
## communism 1.796e-01 4.277e-01 0.420
## serious -4.568e-02 1.668e-01 -0.274
## grow 6.114e-01 1.628e-01 3.757
## google -7.399e-01 1.807e-01 -4.094
## diego 1.008e+00 6.891e-01 1.463
## blank -5.225e-01 2.271e-01 -2.301
## wait -1.642e-01 1.423e-01 -1.154
## vista 2.842e-01 1.027e+00 0.277
## heard 1.799e-01 2.220e-01 0.810
## censorship -1.121e-01 2.833e-01 -0.396
## shes 2.110e-01 1.844e-01 1.144
## mom 7.238e-01 1.455e-01 4.974
## high -3.104e-01 1.164e-01 -2.667
## computeri -8.741e+00 1.004e+03 -0.009
## jesus 5.321e-01 2.010e-01 2.647
## dear 7.730e-02 1.581e-01 0.489
## cuntliz 1.584e+01 1.455e+03 0.011
## aint -1.030e-01 1.293e-01 -0.796
## wanna 6.624e-01 1.890e-01 3.506
## lost 3.803e-01 1.635e-01 2.326
## wtf 2.247e+00 2.015e-01 11.153
## looks -7.046e-01 1.561e-01 -4.514
## disgusting 2.183e+00 2.260e-01 9.660
## censor 5.616e-01 1.871e-01 3.002
## shitheadi 2.355e+01 1.457e+03 0.016
## mesan 1.111e+00 1.290e+00 0.861
## friend -2.694e-01 1.325e-01 -2.034
## chula -1.181e+01 7.658e+02 -0.015
## single -5.346e-01 1.687e-01 -3.169
## rest -7.594e-01 8.736e-02 -8.693
## pretty -6.420e-01 1.627e-01 -3.947
## actions 2.543e-01 2.246e-01 1.133
## `4` -1.078e-01 4.868e-02 -2.214
## money 4.450e-01 1.883e-01 2.364
## came -4.369e-01 1.461e-01 -2.991
## taking -2.364e-01 1.629e-01 -1.451
## sort -2.954e-01 1.365e-01 -2.165
## pneis 1.407e+01 1.455e+03 0.010
## pensnsnniensnsn NA NA NA
## pennnis NA NA NA
## lie -4.827e-01 7.705e-02 -6.265
## anymore -1.364e-01 1.972e-01 -0.692
## hours -3.189e-01 1.857e-01 -1.717
## children -3.793e-01 2.327e-01 -1.630
## vandalize -1.130e+00 1.356e-01 -8.337
## uuuuuu 1.392e+00 8.099e-01 1.718
## okay -1.560e-01 1.668e-01 -0.936
## bet -2.507e-01 7.085e-02 -3.539
## taken -4.363e-01 1.573e-01 -2.773
## shame 1.239e+00 1.478e-01 8.382
## ruining 9.549e-01 3.854e-01 2.478
## nl33ers 1.866e+01 1.028e+03 0.018
## kid 5.806e-01 1.422e-01 4.083
## fffff 1.408e+00 7.645e-01 1.842
## weak -2.684e-01 3.003e-01 -0.894
## shouldnt -1.397e-01 1.625e-01 -0.860
## nerd 2.330e+00 2.163e-01 10.774
## itsuck 1.705e+01 1.455e+03 0.012
## expect -2.049e-01 1.650e-01 -1.242
## deserve 3.095e-01 1.541e-01 2.008
## cougaryou 1.549e+01 1.455e+03 0.011
## attention -4.421e-01 2.007e-01 -2.203
## women 1.477e-01 2.168e-01 0.681
## totally -3.032e-01 2.593e-01 -1.169
## propaganda 2.049e-01 1.754e-01 1.168
## exactly -6.928e-02 1.658e-01 -0.418
## cool -4.139e-01 1.821e-01 -2.274
## comes -5.942e-02 1.660e-01 -0.358
## bother 6.165e-01 1.713e-01 3.599
## happen -4.000e-02 1.359e-01 -0.294
## forever 1.701e-01 2.370e-01 0.718
## wants -4.501e-01 2.084e-01 -2.160
## small -1.954e-01 1.714e-01 -1.140
## minorities 2.158e+00 3.895e-01 5.539
## lying 4.076e-01 1.429e-01 2.851
## insult 1.854e-01 1.427e-01 1.299
## home -2.145e-01 1.657e-01 -1.294
## girl 3.559e-01 1.717e-01 2.074
## worst 1.082e+00 1.926e-01 5.618
## wonder -4.145e-01 1.399e-01 -2.962
## uu 1.978e-01 3.117e-01 0.635
## total 1.978e-01 1.906e-01 1.038
## shot -4.959e-01 2.302e-01 -2.154
## rvv 2.377e+00 9.844e-01 2.415
## obvious -1.662e-01 1.716e-01 -0.968
## news -4.506e-01 1.467e-01 -3.072
## homosexual -4.086e-01 3.190e-01 -1.281
## assholes 6.251e-02 4.649e-01 0.134
## ago -3.946e-01 1.311e-01 -3.009
## administrators -4.447e-01 2.190e-01 -2.031
## worse 5.739e-01 1.959e-01 2.930
## took -2.077e-01 1.616e-01 -1.285
## theyre -3.222e-01 1.903e-01 -1.693
## simple -1.570e-01 1.595e-01 -0.985
## kkkkkk 4.085e+00 2.427e+00 1.683
## kk 5.123e-01 1.785e-01 2.870
## edited -4.336e-01 1.687e-01 -2.570
## cccccc 2.376e+00 1.433e+00 1.658
## together -2.585e-01 1.894e-01 -1.365
## prove -1.867e-01 9.924e-02 -1.882
## knows 2.860e-01 1.682e-01 1.701
## himself -4.480e-01 1.981e-01 -2.262
## fine -7.421e-01 1.452e-01 -5.112
## douchebag -4.314e-01 4.325e-01 -0.998
## di -3.265e-01 3.012e-02 -10.839
## cody -6.051e-01 1.263e+00 -0.479
## allowed -6.380e-01 2.296e-01 -2.779
## `5` -3.020e-01 5.069e-02 -5.957
## remember -5.363e-01 1.749e-01 -3.066
## chink 2.426e+00 6.780e-01 3.578
## brain 8.555e-01 1.728e-01 4.952
## bias -8.683e-02 1.678e-01 -0.518
## behind -3.946e-02 1.937e-01 -0.204
## behavior 1.322e-01 1.813e-01 0.729
## vandalizing -1.659e-01 1.937e-01 -0.856
## side -4.879e-01 7.679e-02 -6.353
## parents -8.929e-01 3.504e-01 -2.548
## millionsix 4.912e+00 1.455e+03 0.003
## gayfrozen 1.797e+01 1.455e+03 0.012
## absolutely -2.756e-01 1.933e-01 -1.426
## silly 9.229e-01 1.714e-01 5.383
## rude 6.462e-01 1.615e-01 4.003
## realized 3.830e-01 4.731e-01 0.810
## names -6.629e-01 1.766e-01 -3.754
## killed -8.161e-01 2.279e-01 -3.582
## faith -2.511e-01 1.708e-01 -1.470
## cut 1.250e-02 1.379e-01 0.091
## acting 5.104e-01 1.747e-01 2.922
## whoreeat 9.308e+00 1.455e+03 0.006
## sit -1.398e-01 5.883e-02 -2.377
## rule -2.947e-01 1.119e-01 -2.634
## gave -2.419e-01 1.885e-01 -1.284
## friggen 1.648e+00 1.175e+00 1.402
## failed 3.655e-01 2.213e-01 1.652
## edie -1.599e+00 6.926e-01 -2.308
## unsigned 2.248e-01 3.862e-01 0.582
## thinks -2.955e-01 2.122e-01 -1.393
## spend 8.244e-01 1.675e-01 4.922
## screw 1.905e+00 1.899e-01 10.032
## public -1.686e-03 1.203e-01 -0.014
## political -1.933e-01 1.777e-01 -1.088
## past -4.799e-01 1.482e-01 -3.237
## garbage 6.598e-01 2.918e-01 2.261
## band -4.095e-01 1.817e-01 -2.253
## baby 8.833e-01 1.970e-01 4.484
## sucking 4.063e+00 5.585e-01 7.275
## speech 6.246e-01 2.253e-01 2.772
## preceding 8.666e-01 3.869e-01 2.240
## hand -9.812e-02 1.155e-01 -0.850
## gayfag -1.413e+00 1.707e+00 -0.828
## cline 1.902e-01 3.009e-01 0.632
## changing 1.508e-01 1.711e-01 0.881
## boohoo 6.877e-01 1.305e+00 0.527
## apparently -4.675e-01 2.414e-01 -1.937
## today -5.389e-01 1.688e-01 -3.192
## nazis -1.821e-01 2.427e-01 -0.750
## gone 1.096e-01 1.821e-01 0.602
## gives 2.434e-01 1.977e-01 1.231
## cuntfranks 1.625e+01 1.455e+03 0.011
## babywhat 1.571e+01 1.455e+03 0.011
## asked -5.737e-01 1.808e-01 -3.173
## `10` -3.415e-01 8.296e-02 -4.117
## stand -4.254e-01 8.156e-02 -5.216
## putting -1.687e-01 1.820e-01 -0.927
## mothers -2.757e-01 4.368e-01 -0.631
## living -2.087e-01 2.028e-01 -1.029
## line -8.653e-01 1.019e-01 -8.493
## excuse 2.445e-01 1.696e-01 1.442
## become -3.371e-01 1.738e-01 -1.939
## wtc -1.883e+00 2.035e+00 -0.926
## wp -1.000e+00 1.022e-01 -9.785
## fight -3.702e-01 1.521e-01 -2.434
## control -1.121e-01 1.802e-01 -0.622
## `17` 4.020e-01 8.453e-02 4.756
## valid 2.153e-02 1.583e-01 0.136
## shannon 2.521e-01 1.061e+00 0.238
## response -5.022e-01 1.647e-01 -3.049
## burn 7.047e-01 1.916e-01 3.678
## userenigmaman 3.598e-01 1.329e+03 0.000
## speak -9.931e-01 1.612e-01 -6.162
## shoot 2.856e-01 2.412e-01 1.184
## night -3.290e-01 1.621e-01 -2.030
## metal -2.476e-01 2.815e-01 -0.880
## fake 6.635e-01 2.151e-01 3.084
## donkey 3.530e+00 4.384e-01 8.053
## cares 5.677e-01 2.285e-01 2.484
## blah 1.082e+00 3.423e-01 3.161
## went -6.954e-01 1.897e-01 -3.666
## upon 1.748e-01 1.945e-01 0.898
## sockpuppet -6.265e-01 2.150e-01 -2.914
## playing 1.604e-01 2.467e-01 0.650
## ones -2.169e-01 9.811e-02 -2.211
## mine -4.968e-01 1.341e-01 -3.704
## freak 1.577e+00 1.899e-01 8.303
## asian -3.138e-02 3.031e-01 -0.104
## arrogant 7.061e-01 2.428e-01 2.908
## accept -6.398e-01 1.305e-01 -4.904
## `2013` -7.380e-01 2.853e-01 -2.586
## `100` 1.626e-01 1.567e-01 1.038
## unless -5.119e-01 1.724e-01 -2.968
## shows -6.317e-01 1.854e-01 -3.408
## attacking 1.017e+00 1.976e-01 5.148
## supposed -1.155e-01 2.057e-01 -0.562
## march -9.168e-01 2.678e-01 -3.423
## lives -1.207e-01 2.468e-01 -0.489
## except -7.163e-02 1.625e-01 -0.441
## certainly -3.672e-01 2.679e-01 -1.371
## themselves -1.037e+00 2.244e-01 -4.620
## spics -1.385e+00 6.333e+00 -0.219
## slap 8.489e-01 3.577e-01 2.373
## salt -2.563e+00 8.126e-01 -3.154
## posting -2.077e-01 1.803e-01 -1.152
## floor 1.824e-01 5.163e-01 0.353
## couldnt -2.725e-01 2.061e-01 -1.323
## bully 1.155e+00 1.943e-01 5.943
## allow 2.459e-01 1.471e-01 1.671
## sir 2.733e-02 1.652e-01 0.165
## mods 3.570e-01 5.507e-01 0.648
## laugh 6.209e-01 1.571e-01 3.953
## diff -3.275e-01 9.873e-02 -3.318
## bring -5.719e-01 1.912e-01 -2.991
## almost -2.388e-01 1.815e-01 -1.316
## trip 2.547e-01 2.032e-01 1.254
## sweet -1.730e-02 3.034e-01 -0.057
## longer -3.226e-01 1.903e-01 -1.695
## latinus 2.523e-01 1.111e+00 0.227
## kike 2.655e+00 5.801e-01 4.577
## jasenm222 2.843e+00 1.455e+03 0.002
## hit 2.353e+00 6.667e-02 35.290
## dickfucking NA NA NA
## biggest 2.781e-01 2.747e-01 1.012
## argument 6.796e-02 1.542e-01 0.441
## ahahahahahahahahahahahahahahahahahahaha 1.537e+01 4.456e+02 0.035
## knob 5.404e-01 6.875e-01 0.786
## finally 3.309e-01 2.894e-01 1.143
## farted 1.730e+01 5.721e+02 0.030
## credit -1.386e-01 2.850e-01 -0.486
## common -8.207e-01 1.672e-01 -4.910
## accounts -3.277e-01 2.402e-01 -1.364
## views -5.103e-01 1.782e-01 -2.864
## jewish -1.031e+00 2.530e-01 -4.073
## hole 2.675e-01 9.948e-02 2.689
## half -2.087e-01 1.802e-01 -1.158
## haha 1.261e+00 1.351e-01 9.331
## fix -8.197e-01 1.460e-01 -5.616
## favor 5.159e-01 1.794e-01 2.876
## crazy 7.545e-01 2.184e-01 3.454
## blood 9.835e-01 2.034e-01 4.835
## warnings 3.941e-01 1.926e-01 2.046
## saw -6.800e-01 1.799e-01 -3.780
## mann 2.592e-03 1.819e-01 0.014
## hurt 6.772e-01 1.793e-01 3.778
## horrible 1.517e+00 2.527e-01 6.003
## hear -3.386e-01 1.464e-01 -2.313
## communist 4.874e-01 2.390e-01 2.040
## british -5.121e-01 2.343e-01 -2.186
## working -9.571e-01 2.053e-01 -4.662
## thinking -7.305e-01 2.278e-01 -3.207
## sweep -2.061e-01 6.778e-01 -0.304
## party -4.739e-01 2.039e-01 -2.324
## open -2.126e-01 1.411e-01 -1.507
## none -7.076e-01 1.942e-01 -3.644
## njgw 1.600e+00 1.389e+00 1.152
## misterwiki 3.650e+00 2.233e+00 1.634
## mad -3.685e-01 7.558e-02 -4.875
## lion -3.668e-01 1.856e-01 -1.977
## lazy 6.567e-01 2.680e-01 2.451
## ignore 1.296e-01 1.936e-01 0.669
## greek -8.283e-03 2.187e-01 -0.038
## giving -5.762e-01 2.164e-01 -2.663
## fuckingabf 1.288e+01 1.455e+03 0.009
## fascist 1.706e+00 2.007e-01 8.501
## certain -1.610e-01 1.960e-01 -0.821
## brown 1.218e-01 2.757e-01 0.442
## bongwarriorcongratualtions 8.839e+00 1.455e+03 0.006
## angela -6.035e-01 8.687e-01 -0.695
## action -3.789e-02 1.656e-01 -0.229
## truly 2.032e-01 2.195e-01 0.926
## reply -8.186e-01 1.736e-01 -4.716
## phuq 5.183e+00 1.641e+00 3.158
## motherfucking 8.638e+00 1.038e+02 0.083
## knowledge -5.255e-01 1.729e-01 -3.040
## kids -7.704e-01 2.985e-01 -2.581
## yooo 1.583e+00 1.126e+00 1.406
## threads -2.083e+00 9.827e-01 -2.119
## stupidity -3.138e-01 2.716e-01 -1.155
## s -1.010e-01 5.351e-02 -1.887
## outside -7.938e-02 2.646e-01 -0.300
## otherwise -5.025e-01 1.830e-01 -2.746
## official -7.637e-01 1.843e-01 -4.144
## muahahahahahahahahahahahahahahahahahaha 1.575e+01 1.455e+03 0.011
## liberal 5.287e-01 2.123e-01 2.491
## lack -3.142e-01 1.777e-01 -1.768
## indeed -2.812e-01 1.921e-01 -1.464
## happened -5.672e-01 2.391e-01 -2.372
## front -1.849e-01 1.982e-01 -0.933
## fit -9.678e-02 1.517e-01 -0.638
## cry 2.376e-01 1.826e-01 1.302
## sloppy 1.078e+00 5.448e-01 1.980
## send 2.129e-01 1.760e-01 1.210
## raid -1.913e-01 2.295e-01 -0.833
## problems -2.856e-01 1.850e-01 -1.544
## pictures -2.171e-01 2.114e-01 -1.027
## nor -1.824e-01 8.786e-02 -2.076
## months -5.378e-02 2.016e-01 -0.267
## jforget -7.306e+00 1.463e+03 -0.005
## jackass 2.410e+00 3.528e-01 6.832
## gamaliel 2.101e+00 4.504e-01 4.666
## fucks 4.398e+00 5.358e-01 8.208
## freedom -6.169e-01 2.915e-01 -2.116
## woman 2.551e-01 2.157e-01 1.182
## song 1.495e-01 1.837e-01 0.814
## rights -2.308e-01 2.078e-01 -1.110
## reasons -1.528e-01 1.947e-01 -0.785
## personally -2.518e-01 2.085e-01 -1.208
## music -6.745e-01 1.970e-01 -3.425
## knew -3.959e-01 2.353e-01 -1.683
## kiss 1.584e+00 2.123e-01 7.462
## itself -7.188e-01 2.167e-01 -3.317
## huh 7.554e-01 2.306e-01 3.276
## forget -5.935e-01 2.355e-01 -2.520
## cuz 8.905e-01 2.915e-01 3.055
## cited 1.091e-01 1.761e-01 0.619
## bye 5.402e-01 2.299e-01 2.350
## annoying 9.998e-01 2.053e-01 4.870
## americans -3.085e-01 3.259e-01 -0.947
## accusations -5.649e-02 2.142e-01 -0.264
## within -1.369e-01 1.931e-01 -0.709
## win -1.289e-01 8.272e-02 -1.559
## vuvuzelas 1.700e+01 1.455e+03 0.012
## spam -3.091e-01 2.019e-01 -1.531
## shove 2.315e+00 3.170e-01 7.303
## puppet 6.653e-01 2.043e-01 3.256
## pay 1.805e-01 1.984e-01 0.910
## oi -2.030e-01 4.381e-02 -4.634
## morons -6.260e-01 3.583e-01 -1.747
## level -3.891e-01 1.956e-01 -1.989
## entry -7.415e-01 2.149e-01 -3.451
## bill -3.382e-01 2.238e-01 -1.511
## bestfrozen 1.466e+01 1.455e+03 0.010
## dicks -2.355e-01 4.036e-01 -0.583
## college -3.875e-01 2.758e-01 -1.405
## close -7.912e-01 1.563e-01 -5.063
## sup -3.556e-01 8.921e-02 -3.986
## re -3.598e-01 3.156e-02 -11.402
## punk 1.319e+00 2.460e-01 5.362
## pissed -1.780e+00 3.441e-01 -5.172
## lolooolbootstoots 1.418e+01 1.455e+03 0.010
## idiotic -1.846e+00 2.787e-01 -6.623
## gg 7.846e-02 6.340e-02 1.238
## fan -2.987e-02 1.101e-01 -0.271
## billj -9.885e-01 5.066e+00 -0.195
## admit -1.364e-01 1.848e-01 -0.738
## yourselves 1.013e+00 3.041e-01 3.332
## terrorist 1.045e+00 2.484e-01 4.205
## steal 6.593e-03 3.640e-01 0.018
## sannse 7.076e-02 5.280e+00 0.013
## related -7.637e-01 1.815e-01 -4.208
## girls 9.502e-02 3.024e-01 0.314
## final -8.720e-02 2.136e-01 -0.408
## earth 2.954e-01 2.091e-01 1.413
## born -4.763e-01 2.060e-01 -2.313
## assume -4.314e-01 1.967e-01 -2.193
## animals -1.532e-02 3.775e-01 -0.041
## america -2.445e-01 1.317e-01 -1.857
## `2006` -8.536e-01 1.937e-01 -4.408
## type -6.787e-01 1.683e-01 -4.034
## system -2.828e-01 1.874e-01 -1.509
## somebody -4.054e-01 2.183e-01 -1.857
## realize -7.134e-01 2.459e-01 -2.901
## muslim 5.555e-01 1.887e-01 2.944
## minutes 6.082e-01 2.140e-01 2.842
## lifetime 8.473e-02 6.846e-01 0.124
## ignorance 3.901e-01 2.625e-01 1.486
## harassing 1.007e+00 2.283e-01 4.411
## destroy 8.294e-01 1.756e-01 4.722
## b -3.011e-01 3.095e-02 -9.727
## author -8.853e-02 1.344e-01 -0.659
## whoever 1.169e-01 2.342e-01 0.499
## wasting -1.131e-03 2.542e-01 -0.004
## useful -5.797e-01 2.014e-01 -2.879
## step -1.604e-01 1.925e-01 -0.833
## offensive -2.242e-01 2.207e-01 -1.016
## hypocrite 2.813e+00 2.508e-01 11.219
## heres -3.293e-01 1.150e-01 -2.863
## goodbye -1.310e-01 4.052e-01 -0.323
## during -7.797e-01 2.169e-01 -3.595
## decide -8.836e-01 1.569e-01 -5.631
## btw -4.229e-01 2.064e-01 -2.049
## blocks -1.552e-01 2.523e-01 -0.615
## worth -4.243e-01 1.588e-01 -2.672
## uncivil 8.013e-01 2.239e-01 3.579
## therefore -2.863e-01 1.908e-01 -1.501
## standards -1.309e-01 2.602e-01 -0.503
## showing -6.612e-01 3.130e-01 -2.112
## semen 1.219e+00 2.144e-01 5.687
## reality -4.580e-02 2.465e-01 -0.186
## libtard 7.514e-01 1.642e+00 0.458
## lame 1.178e-01 1.816e-01 0.649
## games -3.129e-01 3.074e-01 -1.018
## fuckbags 7.764e-01 1.455e+03 0.001
## filter 3.965e-01 4.769e-01 0.832
## contribute -3.623e-01 1.767e-01 -2.051
## city -5.055e-01 1.615e-01 -3.130
## chuck -2.825e-01 5.235e-01 -0.540
## attempt -1.695e-01 1.471e-01 -1.152
## according -6.741e-01 2.079e-01 -3.242
## red -5.501e-01 5.539e-02 -9.931
## limpeddicked 6.653e+00 1.773e+03 0.004
## harassment 5.261e-01 2.328e-01 2.260
## goddamn 9.724e-01 4.740e-01 2.052
## follow -6.257e-01 1.306e-01 -4.789
## chinese -5.931e-02 2.653e-01 -0.224
## award -6.113e-01 2.232e-01 -2.738
## asking -8.894e-01 2.245e-01 -3.963
## accurate -1.656e-01 1.797e-01 -0.921
## threaten 7.878e-01 1.671e-01 4.713
## nate -4.066e-01 1.187e-01 -3.425
## monkey 1.920e+00 2.480e-01 7.741
## losers 4.107e-01 3.772e-01 1.089
## jack 4.163e-01 1.776e-01 2.344
## Pr(>|z|)
## (Intercept) < 2e-16 ***
## fat 3.64e-13 ***
## faggot 0.000141 ***
## moron < 2e-16 ***
## cunt < 2e-16 ***
## sucks < 2e-16 ***
## stupid < 2e-16 ***
## bitch < 2e-16 ***
## pig 1.33e-15 ***
## jew 1.08e-13 ***
## dick < 2e-16 ***
## bullshit < 2e-16 ***
## wanker < 2e-16 ***
## fag < 2e-16 ***
## bark 0.195507
## balls < 2e-16 ***
## asshole < 2e-16 ***
## sex < 2e-16 ***
## cock < 2e-16 ***
## piece 1.26e-11 ***
## nipple 0.706377
## penis < 2e-16 ***
## kill < 2e-16 ***
## hell < 2e-16 ***
## aids 0.000150 ***
## dickhead 0.943867
## bastard < 2e-16 ***
## fucker < 2e-16 ***
## shut < 2e-16 ***
## eat 2.42e-06 ***
## faggots 0.134511
## idiot < 2e-16 ***
## damn < 2e-16 ***
## loser < 2e-16 ***
## fucksex 0.994095
## yourselfgo 0.986896
## rape 9.94e-06 ***
## homo 8.26e-15 ***
## huge 0.774540
## cocksucker 0.016799 *
## super 0.002232 **
## ban 0.000114 ***
## poop < 2e-16 ***
## god 0.001282 **
## buttsecks 0.986634
## dog 1.76e-06 ***
## mothjer 0.993295
## mother 5.59e-12 ***
## fggt 1.26e-05 ***
## hitler 3.08e-06 ***
## noobs 7.96e-05 ***
## youi 0.307767
## pussy < 2e-16 ***
## admins 0.263000
## guys 0.262249
## bush 0.281877
## banned 0.370639
## anal 0.000385 ***
## d 3.57e-06 ***
## heil 0.004277 **
## dumb < 2e-16 ***
## boobs 1.42e-06 ***
## mexicans 0.093567 .
## fuckin < 2e-16 ***
## crap < 2e-16 ***
## offfuck 0.990743
## retarded 0.133050
## proassadhanibal911youre 0.986336
## niggas 0.919194
## ur 0.056351 .
## bollocks 0.909898
## ha < 2e-16 ***
## cocks 0.448242
## racist < 2e-16 ***
## nice 0.007106 **
## bitchesfuck 0.992655
## sexsex 0.465003
## pathetic < 2e-16 ***
## useless 0.028011 *
## power 0.930688
## hes 8.63e-08 ***
## sexual 0.013882 *
## youfuck 0.971639
## alone 5.25e-11 ***
## bitchfuck 0.991809
## notrhbysouthbanof 0.989200
## lick 0.941611
## deleting 0.000232 ***
## cocksucking 0.960679
## guy 0.351583
## oxymoron 0.050087 .
## live 0.055249 .
## criminalwar 0.998304
## bunksteve 0.990177
## assfuck 0.451506
## yeah 0.004842 **
## seriously 0.000330 ***
## bot 7.02e-06 ***
## chester 0.856004
## truth 0.226585
## romney 0.473933
## mitt 0.005431 **
## marcolfuck 0.990320
## cunts 0.940110
## head 1.06e-07 ***
## nazi < 2e-16 ***
## bum 0.013335 *
## penissmall 0.992394
## gonna 1.47e-09 ***
## dirty < 2e-16 ***
## bloody 2.07e-05 ***
## whatever 0.031605 *
## everyone 0.000502 ***
## loves 0.056036 .
## homeland 0.164268
## arse < 2e-16 ***
## fack 0.000137 ***
## smells 1.67e-05 ***
## tommy2010 0.080161 .
## securityfuck 0.990380
## stuff 0.233521
## cuntbag 0.981361
## vomit 0.474353
## face 1.34e-07 ***
## fun 0.551921
## f 0.094069 .
## internet 0.401540
## wales 0.633210
## spanish 0.067224 .
## sick < 2e-16 ***
## youbollocks 0.991142
## takes 3.33e-05 ***
## basteredbastered 0.990205
## guess 0.102456
## fartchina 0.991331
## jews 0.001681 **
## white < 2e-16 ***
## veggietales 0.981452
## proof 0.001229 **
## talking 0.626882
## job 0.012393 *
## everything 0.541400
## whore < 2e-16 ***
## ancestryfuckoffjewish 0.990422
## useredgar181 0.370600
## egg 0.907907
## black 3.17e-05 ***
## dude 6.16e-14 ***
## full 0.689584
## idiots 1.53e-05 ***
## cheese 0.073820 .
## robert 0.006087 **
## atheist 0.979470
## ya 0.479732
## calling 0.088349 .
## vagina 3.87e-15 ***
## fire 0.370151
## anthony 0.826593
## obviously 0.135416
## chicken 0.158936
## sucku 0.004850 **
## licker 0.031627 *
## jerk < 2e-16 ***
## blocking 0.004648 **
## whats 0.350145
## havent 0.309862
## fool < 2e-16 ***
## ugly < 2e-16 ***
## ignorant < 2e-16 ***
## ullmann 0.833183
## jdelanoy 0.003276 **
## bradbury 0.745451
## hard 0.001020 **
## lies < 2e-16 ***
## son 2.00e-06 ***
## shitfuck 0.980764
## sad 0.065472 .
## nigga < 2e-16 ***
## arent 0.443055
## unblock 0.004893 **
## bunch 0.000103 ***
## fan1967 0.056407 .
## centraliststupid 0.991521
## terrorists 0.849605
## fired 0.195901
## usernhrhs2010 0.984368
## death 0.230330
## drink 1.65e-05 ***
## jim 0.212057
## told 0.070464 .
## reading 0.001448 **
## troll 2.39e-08 ***
## lmao 0.002664 **
## joke 4.06e-07 ***
## stay 0.694183
## mongo 0.731773
## vandal 0.006234 **
## reverting 0.697340
## mum 0.002940 **
## piss < 2e-16 ***
## cause 0.715829
## r < 2e-16 ***
## motherfucker 0.408958
## ricehey 0.649909
## abusing 0.525109
## wasnt 7.92e-05 ***
## dare 3.31e-14 ***
## george 0.042950 *
## c 0.305812
## bag 5.21e-16 ***
## ahead 0.906276
## scum < 2e-16 ***
## nonsense 2.26e-06 ***
## game 0.023752 *
## quit 0.836676
## dumbass 4.43e-06 ***
## play 0.183874
## friends 0.831572
## dead 0.204784
## messages 0.763382
## o 0.860368
## shall 0.303114
## youll 0.132283
## mouth 2.86e-13 ***
## false 0.454945
## completely 0.407972
## wow 0.138945
## gets 0.291284
## bleachanhero 0.995616
## ps 1.97e-05 ***
## along 0.000357 ***
## liar 2.81e-14 ***
## country 0.569759
## boy 1.32e-10 ***
## aidsaids 0.991170
## yo < 2e-16 ***
## threats 0.005445 **
## n < 2e-16 ***
## fucked < 2e-16 ***
## act 3.83e-15 ***
## murder 0.000739 ***
## listen 0.400594
## bitches 0.955117
## wikipedians 0.968250
## foolwhat 0.992290
## fck < 2e-16 ***
## bitchmattythewhite 0.992955
## retard < 2e-16 ***
## due 0.456651
## twat 3.71e-14 ***
## run 0.157894
## hairy 0.001261 **
## goes 0.001622 **
## computer 0.006930 **
## reported 0.662717
## wanted 0.042208 *
## abuse 0.005394 **
## posted 0.137953
## yours 5.15e-09 ***
## prick < 2e-16 ***
## house 0.017982 *
## administrator 0.000312 ***
## shithole 0.324253
## mr 0.561703
## jones 0.565516
## funny 0.512419
## yaaaaah 0.994708
## yaaa 0.713601
## worthless 3.69e-05 ***
## telling 0.005030 **
## self 0.087759 .
## niggers < 2e-16 ***
## human 0.633948
## haahhahahah 0.231620
## men < 2e-16 ***
## learn 1.04e-08 ***
## king 0.851270
## family 0.065273 .
## waste 0.005481 **
## stick 0.703350
## child 1.34e-05 ***
## biased 0.065407 .
## administratorprick 0.991519
## likes 4.55e-11 ***
## eats 0.061980 .
## coward < 2e-16 ***
## cougar 3.33e-06 ***
## soon 0.186366
## posts 0.205848
## peoples 0.354122
## leaving 0.305770
## deal 0.000246 ***
## watching 0.812534
## report 0.046937 *
## complete 0.010625 *
## wouldnt 0.199124
## john 4.03e-06 ***
## eyes 0.184996
## business 0.000174 ***
## sock 0.115779
## poor 4.00e-05 ***
## coming 0.300683
## watch 0.005278 **
## chocobos 0.984413
## writing 0.166234
## enjoy 0.526034
## dipshit 0.000727 ***
## california 0.711825
## butt 3.45e-09 ***
## tried 0.195963
## shitty 0.000231 ***
## ridiculous 4.44e-15 ***
## arrest 0.017923 *
## `8dpenis` 0.992186
## respect 0.003120 **
## evil 3.68e-09 ***
## nobody 0.928188
## lets 0.014368 *
## entire 0.001661 **
## douche < 2e-16 ***
## communism 0.674550
## serious 0.784168
## grow 0.000172 ***
## google 4.24e-05 ***
## diego 0.143418
## blank 0.021389 *
## wait 0.248451
## vista 0.782117
## heard 0.417665
## censorship 0.692434
## shes 0.252571
## mom 6.56e-07 ***
## high 0.007646 **
## computeri 0.993054
## jesus 0.008110 **
## dear 0.624943
## cuntliz 0.991318
## aint 0.425855
## wanna 0.000456 ***
## lost 0.020019 *
## wtf < 2e-16 ***
## looks 6.36e-06 ***
## disgusting < 2e-16 ***
## censor 0.002681 **
## shitheadi 0.987105
## mesan 0.389236
## friend 0.041989 *
## chula 0.987694
## single 0.001527 **
## rest < 2e-16 ***
## pretty 7.91e-05 ***
## actions 0.257415
## `4` 0.026839 *
## money 0.018088 *
## came 0.002785 **
## taking 0.146862
## sort 0.030409 *
## pneis 0.992289
## pensnsnniensnsn NA
## pennnis NA
## lie 3.73e-10 ***
## anymore 0.488953
## hours 0.085904 .
## children 0.103089
## vandalize < 2e-16 ***
## uuuuuu 0.085735 .
## okay 0.349519
## bet 0.000402 ***
## taken 0.005546 **
## shame < 2e-16 ***
## ruining 0.013230 *
## nl33ers 0.985513
## kid 4.44e-05 ***
## fffff 0.065530 .
## weak 0.371295
## shouldnt 0.389840
## nerd < 2e-16 ***
## itsuck 0.990651
## expect 0.214194
## deserve 0.044659 *
## cougaryou 0.991508
## attention 0.027593 *
## women 0.495867
## totally 0.242288
## propaganda 0.242875
## exactly 0.675984
## cool 0.022994 *
## comes 0.720330
## bother 0.000319 ***
## happen 0.768414
## forever 0.472928
## wants 0.030810 *
## small 0.254460
## minorities 3.05e-08 ***
## lying 0.004351 **
## insult 0.193823
## home 0.195555
## girl 0.038116 *
## worst 1.93e-08 ***
## wonder 0.003058 **
## uu 0.525608
## total 0.299308
## shot 0.031260 *
## rvv 0.015755 *
## obvious 0.332820
## news 0.002128 **
## homosexual 0.200212
## assholes 0.893041
## ago 0.002622 **
## administrators 0.042276 *
## worse 0.003389 **
## took 0.198765
## theyre 0.090470 .
## simple 0.324841
## kkkkkk 0.092394 .
## kk 0.004103 **
## edited 0.010183 *
## cccccc 0.097242 .
## together 0.172376
## prove 0.059894 .
## knows 0.089007 .
## himself 0.023698 *
## fine 3.19e-07 ***
## douchebag 0.318488
## di < 2e-16 ***
## cody 0.631977
## allowed 0.005451 **
## `5` 2.57e-09 ***
## remember 0.002171 **
## chink 0.000346 ***
## brain 7.36e-07 ***
## bias 0.604715
## behind 0.838567
## behavior 0.465907
## vandalizing 0.391882
## side 2.11e-10 ***
## parents 0.010821 *
## millionsix 0.997307
## gayfrozen 0.990150
## absolutely 0.154010
## silly 7.32e-08 ***
## rude 6.27e-05 ***
## realized 0.418137
## names 0.000174 ***
## killed 0.000341 ***
## faith 0.141565
## cut 0.927764
## acting 0.003480 **
## whoreeat 0.994897
## sit 0.017467 *
## rule 0.008449 **
## gave 0.199267
## friggen 0.160827
## failed 0.098555 .
## edie 0.020981 *
## unsigned 0.560388
## thinks 0.163725
## spend 8.55e-07 ***
## screw < 2e-16 ***
## public 0.988823
## political 0.276801
## past 0.001206 **
## garbage 0.023753 *
## band 0.024233 *
## baby 7.33e-06 ***
## sucking 3.47e-13 ***
## speech 0.005579 **
## preceding 0.025111 *
## hand 0.395578
## gayfag 0.407658
## cline 0.527415
## changing 0.378106
## boohoo 0.598122
## apparently 0.052797 .
## today 0.001414 **
## nazis 0.453092
## gone 0.547198
## gives 0.218232
## cuntfranks 0.991092
## babywhat 0.991390
## asked 0.001509 **
## `10` 3.84e-05 ***
## stand 1.83e-07 ***
## putting 0.353874
## mothers 0.527816
## living 0.303332
## line < 2e-16 ***
## excuse 0.149298
## become 0.052507 .
## wtc 0.354682
## wp < 2e-16 ***
## fight 0.014914 *
## control 0.533852
## `17` 1.97e-06 ***
## valid 0.891797
## shannon 0.812220
## response 0.002298 **
## burn 0.000235 ***
## userenigmaman 0.999784
## speak 7.16e-10 ***
## shoot 0.236375
## night 0.042333 *
## metal 0.379098
## fake 0.002040 **
## donkey 8.10e-16 ***
## cares 0.012991 *
## blah 0.001571 **
## went 0.000247 ***
## upon 0.368921
## sockpuppet 0.003567 **
## playing 0.515523
## ones 0.027059 *
## mine 0.000212 ***
## freak < 2e-16 ***
## asian 0.917541
## arrogant 0.003639 **
## accept 9.38e-07 ***
## `2013` 0.009696 **
## `100` 0.299374
## unless 0.002993 **
## shows 0.000654 ***
## attacking 2.63e-07 ***
## supposed 0.574444
## march 0.000620 ***
## lives 0.624683
## except 0.659271
## certainly 0.170471
## themselves 3.83e-06 ***
## spics 0.826943
## slap 0.017641 *
## salt 0.001612 **
## posting 0.249310
## floor 0.723871
## couldnt 0.185991
## bully 2.80e-09 ***
## allow 0.094638 .
## sir 0.868618
## mods 0.516762
## laugh 7.72e-05 ***
## diff 0.000908 ***
## bring 0.002778 **
## almost 0.188270
## trip 0.209883
## sweet 0.954527
## longer 0.090056 .
## latinus 0.820338
## kike 4.73e-06 ***
## jasenm222 0.998441
## hit < 2e-16 ***
## dickfucking NA
## biggest 0.311329
## argument 0.659331
## ahahahahahahahahahahahahahahahahahahaha 0.972478
## knob 0.431841
## finally 0.252835
## farted 0.975877
## credit 0.626768
## common 9.13e-07 ***
## accounts 0.172561
## views 0.004185 **
## jewish 4.65e-05 ***
## hole 0.007160 **
## half 0.246891
## haha < 2e-16 ***
## fix 1.96e-08 ***
## favor 0.004027 **
## crazy 0.000552 ***
## blood 1.33e-06 ***
## warnings 0.040745 *
## saw 0.000157 ***
## mann 0.988630
## hurt 0.000158 ***
## horrible 1.93e-09 ***
## hear 0.020726 *
## communist 0.041359 *
## british 0.028823 *
## working 3.13e-06 ***
## thinking 0.001342 **
## sweep 0.761012
## party 0.020137 *
## open 0.131920
## none 0.000268 ***
## njgw 0.249497
## misterwiki 0.102169
## mad 1.09e-06 ***
## lion 0.048074 *
## lazy 0.014260 *
## ignore 0.503265
## greek 0.969787
## giving 0.007742 **
## fuckingabf 0.992937
## fascist < 2e-16 ***
## certain 0.411606
## brown 0.658690
## bongwarriorcongratualtions 0.995154
## angela 0.487266
## action 0.818993
## truly 0.354688
## reply 2.40e-06 ***
## phuq 0.001589 **
## motherfucking 0.933654
## knowledge 0.002364 **
## kids 0.009861 **
## yooo 0.159810
## threads 0.034066 *
## stupidity 0.248081
## s 0.059101 .
## outside 0.764178
## otherwise 0.006032 **
## official 3.42e-05 ***
## muahahahahahahahahahahahahahahahahahaha 0.991365
## liberal 0.012749 *
## lack 0.077067 .
## indeed 0.143114
## happened 0.017676 *
## front 0.351052
## fit 0.523340
## cry 0.193087
## sloppy 0.047760 *
## send 0.226353
## raid 0.404721
## problems 0.122627
## pictures 0.304389
## nor 0.037894 *
## months 0.789698
## jforget 0.996016
## jackass 8.39e-12 ***
## gamaliel 3.08e-06 ***
## fucks 2.24e-16 ***
## freedom 0.034331 *
## woman 0.237076
## song 0.415796
## rights 0.266834
## reasons 0.432601
## personally 0.227191
## music 0.000616 ***
## knew 0.092444 .
## kiss 8.54e-14 ***
## itself 0.000910 ***
## huh 0.001053 **
## forget 0.011728 *
## cuz 0.002250 **
## cited 0.535804
## bye 0.018798 *
## annoying 1.12e-06 ***
## americans 0.343778
## accusations 0.791978
## within 0.478301
## win 0.119065
## vuvuzelas 0.990680
## spam 0.125691
## shove 2.82e-13 ***
## puppet 0.001130 **
## pay 0.362807
## oi 3.59e-06 ***
## morons 0.080604 .
## level 0.046690 *
## entry 0.000558 ***
## bill 0.130832
## bestfrozen 0.991963
## dicks 0.559654
## college 0.160011
## close 4.13e-07 ***
## sup 6.71e-05 ***
## re < 2e-16 ***
## punk 8.22e-08 ***
## pissed 2.31e-07 ***
## lolooolbootstoots 0.992225
## idiotic 3.51e-11 ***
## gg 0.215864
## fan 0.786142
## billj 0.845300
## admit 0.460543
## yourselves 0.000862 ***
## terrorist 2.61e-05 ***
## steal 0.985547
## sannse 0.989307
## related 2.57e-05 ***
## girls 0.753351
## final 0.683092
## earth 0.157720
## born 0.020745 *
## assume 0.028282 *
## animals 0.967637
## america 0.063296 .
## `2006` 1.04e-05 ***
## type 5.49e-05 ***
## system 0.131227
## somebody 0.063260 .
## realize 0.003723 **
## muslim 0.003237 **
## minutes 0.004488 **
## lifetime 0.901505
## ignorance 0.137228
## harassing 1.03e-05 ***
## destroy 2.33e-06 ***
## b < 2e-16 ***
## author 0.510094
## whoever 0.617645
## wasting 0.996450
## useful 0.003992 **
## step 0.404843
## offensive 0.309661
## hypocrite < 2e-16 ***
## heres 0.004195 **
## goodbye 0.746472
## during 0.000324 ***
## decide 1.79e-08 ***
## btw 0.040487 *
## blocks 0.538487
## worth 0.007545 **
## uncivil 0.000345 ***
## therefore 0.133435
## standards 0.614895
## showing 0.034647 *
## semen 1.29e-08 ***
## reality 0.852581
## libtard 0.647291
## lame 0.516272
## games 0.308814
## fuckbags 0.999574
## filter 0.405676
## contribute 0.040303 *
## city 0.001749 **
## chuck 0.589468
## attempt 0.249121
## according 0.001186 **
## red < 2e-16 ***
## limpeddicked 0.997006
## harassment 0.023835 *
## goddamn 0.040217 *
## follow 1.68e-06 ***
## chinese 0.823099
## award 0.006179 **
## asking 7.41e-05 ***
## accurate 0.356930
## threaten 2.44e-06 ***
## nate 0.000615 ***
## monkey 9.86e-15 ***
## losers 0.276271
## jack 0.019076 *
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## (Dispersion parameter for binomial family taken to be 1)
##
## Null deviance: 100803 on 159570 degrees of freedom
## Residual deviance: 50057 on 158833 degrees of freedom
## AIC: 51533
##
## Number of Fisher Scoring iterations: 14
confusion_data(tox_reg)
## Maximum accuracy is acheived at a cutoff of: 0.42

##
## Confusion Matrix and Statistics
##
## Reference
## Prediction 0 1
## 0 142287 6184
## 1 1990 9110
##
## Accuracy : 0.9488
## 95% CI : (0.9477, 0.9498)
## No Information Rate : 0.9042
## P-Value [Acc > NIR] : < 2.2e-16
##
## Kappa : 0.6632
## Mcnemar's Test P-Value : < 2.2e-16
##
## Sensitivity : 0.9862
## Specificity : 0.5957
## Pos Pred Value : 0.9583
## Neg Pred Value : 0.8207
## Prevalence : 0.9042
## Detection Rate : 0.8917
## Detection Prevalence : 0.9304
## Balanced Accuracy : 0.7909
## F-val Accuracy : 0.9721
##
## 'Positive' Class : 0
summary(stx_reg)
##
## Call:
## glm(formula = severe_toxic ~ ., family = binomial(link = "logit"),
## data = stx_tmp)
##
## Deviance Residuals:
## Min 1Q Median 3Q Max
## -4.5334 -0.1174 -0.0746 -0.0641 4.0880
##
## Coefficients:
## Estimate Std. Error z value Pr(>|z|)
## (Intercept) -4.77694 0.12549 -38.066 < 2e-16 ***
## faggot 1.90871 0.14941 12.775 < 2e-16 ***
## sucks 0.94906 0.30784 3.083 0.002050 **
## cunt 1.68386 0.15223 11.061 < 2e-16 ***
## bitch 2.10868 0.11740 17.961 < 2e-16 ***
## cock 1.60640 0.18027 8.911 < 2e-16 ***
## fucksex 20.13154 2399.54471 0.008 0.993306
## yourselfgo 21.01668 1655.40674 0.013 0.989871
## fucker 1.97510 0.19209 10.282 < 2e-16 ***
## kill 0.60244 0.18855 3.195 0.001397 **
## cocksucker 1.88632 0.76618 2.462 0.013817 *
## dick 2.93896 0.13779 21.329 < 2e-16 ***
## piece 1.22165 0.16336 7.478 7.53e-14 ***
## mothjer 16.70889 1073.10913 0.016 0.987577
## bastard 1.46654 0.21450 6.837 8.08e-12 ***
## asshole 1.88951 0.13671 13.821 < 2e-16 ***
## huge -0.37978 0.47663 -0.797 0.425568
## shut 1.46060 0.19629 7.441 9.99e-14 ***
## fat 0.44759 0.19396 2.308 0.021020 *
## damn 0.38687 0.26545 1.457 0.145002
## rape 1.62166 0.24001 6.757 1.41e-11 ***
## dog -0.04957 0.33479 -0.148 0.882292
## stupid 0.70218 0.15746 4.460 8.21e-06 ***
## offfuck 20.13154 2399.54472 0.008 0.993306
## mexicans 2.65742 0.74935 3.546 0.000391 ***
## anal 0.39443 0.34151 1.155 0.248107
## proassadhanibal911youre 21.28542 1385.37781 0.015 0.987742
## eat -1.02473 0.13556 -7.559 4.05e-14 ***
## niggas 0.06584 0.96872 0.068 0.945812
## d -1.40895 0.07925 -17.778 < 2e-16 ***
## bitchesfuck 17.82423 2399.54475 0.007 0.994073
## pussy 0.71192 0.30153 2.361 0.018225 *
## dickhead -0.56217 0.40958 -1.373 0.169892
## youfuck 21.17927 1008.72002 0.021 0.983249
## bitchfuck -0.31841 1.98257 -0.161 0.872403
## bush 1.09301 0.41367 2.642 0.008236 **
## criminalwar 17.05733 2399.54473 0.007 0.994328
## bunksteve 21.34301 2399.54472 0.009 0.992903
## assfuck 2.75353 1.16814 2.357 0.018413 *
## cocksucking 1.90702 0.77326 2.466 0.013656 *
## chester -11.22537 173.59604 -0.065 0.948442
## marcolfuck 31.35692 2405.81596 0.013 0.989601
## penissmall 20.98427 2399.54474 0.009 0.993023
## cocks -2.04517 0.68489 -2.986 0.002825 **
## fack 3.64984 0.94554 3.860 0.000113 ***
## useless 0.87190 0.40711 2.142 0.032220 *
## mother 0.61072 0.16800 3.635 0.000278 ***
## homeland 1.30109 1.03663 1.255 0.209439
## notrhbysouthbanof 2.85580 1.94995 1.465 0.143044
## securityfuck 20.23940 2399.54494 0.008 0.993270
## bot -1.53975 0.30055 -5.123 3.00e-07 ***
## admins 0.10034 0.29970 0.335 0.737771
## veggietales 4.51162 1.76714 2.553 0.010678 *
## ancestryfuckoffjewish 20.13154 2399.54472 0.008 0.993306
## cunts -0.27653 0.43785 -0.632 0.527668
## moron 0.56964 0.26373 2.160 0.030778 *
## sucku 3.55891 1.15326 3.086 0.002029 **
## loves 0.32290 0.63091 0.512 0.608795
## shitfuck 2.18104 1.29721 1.681 0.092698 .
## bradbury 4.55099 1.41060 3.226 0.001254 **
## anthony -1.10194 1.37823 -0.800 0.423983
## atheist -0.08748 0.88995 -0.098 0.921699
## fuckin 2.46349 0.08413 29.282 < 2e-16 ***
## fired 0.25994 1.02189 0.254 0.799207
## jim -0.54063 0.58840 -0.919 0.358188
## wales -0.72103 0.87940 -0.820 0.412265
## drink -0.51113 0.66525 -0.768 0.442287
## bleachanhero 18.37497 2399.54483 0.008 0.993890
## god 0.14878 0.23969 0.621 0.534800
## lick -0.03551 0.28827 -0.123 0.901961
## bitchmattythewhite 18.54702 2399.54472 0.008 0.993833
## hell -0.06030 0.16021 -0.376 0.706608
## whore 0.78822 0.31610 2.494 0.012647 *
## yaaaaah 17.41022 2399.54605 0.007 0.994211
## yaaa -3.69253 2.29050 -1.612 0.106939
## haahhahahah 4.82932 1.06065 4.553 5.28e-06 ***
## f 0.52416 0.09126 5.744 9.26e-09 ***
## nice -1.30624 0.37549 -3.479 0.000504 ***
## nigga 1.66643 0.38260 4.356 1.33e-05 ***
## loser 0.13677 0.27168 0.503 0.614657
## dirty 2.14892 0.31019 6.928 4.27e-12 ***
## arse 0.40378 0.33980 1.188 0.234724
## penis 1.76768 0.25826 6.844 7.68e-12 ***
## mum 0.81862 0.38773 2.111 0.034745 *
## takes -0.20695 0.38616 -0.536 0.592021
## ban -0.24727 0.17123 -1.444 0.148707
## `8dpenis` 20.98427 2399.54474 0.009 0.993023
## c 0.68731 0.12471 5.511 3.56e-08 ***
## nl33ers 21.34301 1696.73435 0.013 0.989964
## murder -0.12120 0.49249 -0.246 0.805604
## itsuck 20.65570 2399.54472 0.009 0.993132
## communism 0.86652 1.01176 0.856 0.391752
## homo 0.70159 0.25921 2.707 0.006797 **
## eats 0.12442 0.50612 0.246 0.805808
## fffff 1.80770 0.80979 2.232 0.025595 *
## uuuuuu 2.93407 0.97879 2.998 0.002721 **
## uu -0.81995 0.85558 -0.958 0.337884
## rvv 4.01573 0.79615 5.044 4.56e-07 ***
## kkkkkk 2.89564 1.01916 2.841 0.004494 **
## kk 0.77244 0.33757 2.288 0.022125 *
## cccccc -2.79038 1.38276 -2.018 0.043593 *
## bitches 0.19863 0.38967 0.510 0.610243
## blank -1.52059 0.85689 -1.775 0.075972 .
## fck 3.43905 0.31096 11.059 < 2e-16 ***
## whoreeat 19.45408 2399.54477 0.008 0.993531
## edie -0.63038 1.09641 -0.575 0.565328
## di -0.90825 0.07489 -12.128 < 2e-16 ***
## usernhrhs2010 16.29205 399.01266 0.041 0.967431
## romney -10.23310 399.00848 -0.026 0.979539
## mitt -3.36990 1.44600 -2.330 0.019780 *
## computeri -10.68340 1696.73427 -0.006 0.994976
## reading -0.38427 0.41218 -0.932 0.351191
## vista -11.25556 322.61678 -0.035 0.972169
## shitheadi 59.91135 2346.52244 0.026 0.979631
## mesan -10.67502 799.95900 -0.013 0.989353
## diego -10.56350 273.38080 -0.039 0.969177
## chula -11.45267 1344.80493 -0.009 0.993205
## california -2.67212 2.39357 -1.116 0.264262
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## (Dispersion parameter for binomial family taken to be 1)
##
## Null deviance: 17866 on 159570 degrees of freedom
## Residual deviance: 11588 on 159453 degrees of freedom
## AIC: 11824
##
## Number of Fisher Scoring iterations: 15
confusion_data(stx_reg)
## Maximum accuracy is acheived at a cutoff of: 0.73

##
## Confusion Matrix and Statistics
##
## Reference
## Prediction 0 1
## 0 157855 1414
## 1 121 181
##
## Accuracy : 0.9904
## 95% CI : (0.9899, 0.9908)
## No Information Rate : 0.9900
## P-Value [Acc > NIR] : 0.06648
##
## Kappa : 0.1882
## Mcnemar's Test P-Value : < 2.2e-16
##
## Sensitivity : 0.9992
## Specificity : 0.1135
## Pos Pred Value : 0.9911
## Neg Pred Value : 0.5993
## Prevalence : 0.9900
## Detection Rate : 0.9892
## Detection Prevalence : 0.9981
## Balanced Accuracy : 0.5564
## F-val Accuracy : 0.9952
##
## 'Positive' Class : 0
summary(obs_reg)
##
## Call:
## glm(formula = obscene ~ ., family = binomial(link = "logit"),
## data = obs_tmp)
##
## Deviance Residuals:
## Min 1Q Median 3Q Max
## -6.9892 -0.2002 -0.1318 -0.0756 4.9065
##
## Coefficients: (3 not defined because of singularities)
## Estimate Std. Error z value Pr(>|z|)
## (Intercept) -2.076e+00 1.000e-01 -20.756 < 2e-16 ***
## cunt 4.598e+00 1.760e-01 26.131 < 2e-16 ***
## bitch 4.858e+00 1.475e-01 32.945 < 2e-16 ***
## fat 7.500e-01 1.363e-01 5.502 3.75e-08 ***
## faggot 1.569e+00 2.375e-01 6.607 3.92e-11 ***
## dick 4.184e+00 1.148e-01 36.436 < 2e-16 ***
## bullshit 3.939e+00 1.458e-01 27.019 < 2e-16 ***
## sucks 2.921e+00 1.957e-01 14.924 < 2e-16 ***
## stupid 1.961e+00 9.465e-02 20.714 < 2e-16 ***
## asshole 4.202e+00 1.885e-01 22.295 < 2e-16 ***
## cock 3.192e+00 1.528e-01 20.885 < 2e-16 ***
## nipple -3.421e-01 7.340e-01 -0.466 0.641183
## fucker 5.443e+00 3.746e-01 14.533 < 2e-16 ***
## dickhead -7.770e-01 3.441e-01 -2.258 0.023929 *
## bastard 3.765e+00 1.737e-01 21.672 < 2e-16 ***
## piece 1.759e+00 1.238e-01 14.213 < 2e-16 ***
## faggots -1.633e-01 4.160e-01 -0.393 0.694678
## jew 2.613e-01 2.192e-01 1.192 0.233118
## penis 3.561e+00 1.716e-01 20.755 < 2e-16 ***
## fucksex 1.008e+01 8.827e+02 0.011 0.990889
## yourselfgo 1.602e+01 6.141e+02 0.026 0.979189
## damn 2.383e+00 1.442e-01 16.525 < 2e-16 ***
## eat -3.267e-01 6.981e-02 -4.679 2.88e-06 ***
## shut 1.628e+00 1.596e-01 10.199 < 2e-16 ***
## cocksucker 3.597e+00 7.766e-01 4.633 3.61e-06 ***
## huge 2.112e-01 2.836e-01 0.745 0.456411
## buttsecks 1.137e+00 1.471e+00 0.773 0.439637
## mothjer 5.320e+00 3.948e+02 0.013 0.989248
## kill 4.927e-01 1.408e-01 3.500 0.000465 ***
## poop 1.846e+00 3.703e-01 4.985 6.21e-07 ***
## pussy 3.739e+00 2.770e-01 13.496 < 2e-16 ***
## dog 5.237e-01 1.941e-01 2.698 0.006982 **
## rape 7.033e-01 2.548e-01 2.760 0.005773 **
## mother 6.855e-01 2.112e-01 3.246 0.001170 **
## anal 9.878e-01 1.941e-01 5.089 3.59e-07 ***
## boobs 2.122e+00 7.359e-01 2.884 0.003932 **
## hell 4.116e-01 8.898e-02 4.626 3.73e-06 ***
## d -4.978e-01 5.315e-02 -9.365 < 2e-16 ***
## fuckin 5.325e+00 1.233e-01 43.174 < 2e-16 ***
## mexicans 1.263e+00 7.853e-01 1.609 0.107639
## offfuck 1.550e+01 8.827e+02 0.018 0.985987
## idiot 2.664e+00 1.086e-01 24.541 < 2e-16 ***
## proassadhanibal911youre 1.543e+01 5.097e+02 0.030 0.975846
## niggas -7.154e-01 1.093e+00 -0.655 0.512673
## ban 2.812e-01 1.205e-01 2.334 0.019592 *
## bitchesfuck 1.095e+01 8.827e+02 0.012 0.990104
## cocks -1.726e+00 5.891e-01 -2.930 0.003394 **
## bollocks -1.487e+00 8.479e-01 -1.754 0.079407 .
## fag 2.409e+00 1.572e-01 15.325 < 2e-16 ***
## youfuck 1.795e+01 2.849e+02 0.063 0.949768
## guys 4.223e-01 2.236e-01 1.888 0.059000 .
## bitchfuck 7.941e+00 3.651e+02 0.022 0.982649
## notrhbysouthbanof 1.396e+01 5.097e+02 0.027 0.978141
## admins -2.139e-01 1.859e-01 -1.150 0.250021
## dumb 2.029e+00 1.600e-01 12.676 < 2e-16 ***
## cocksucking -2.138e+00 1.046e+00 -2.043 0.041040 *
## assfuck 6.386e-02 1.323e+00 0.048 0.961497
## useless -2.266e-01 2.990e-01 -0.758 0.448498
## wanker 2.541e+00 3.128e-01 8.125 4.47e-16 ***
## fggt 2.458e+00 7.737e-01 3.177 0.001488 **
## chester -5.600e-01 1.064e+00 -0.526 0.598803
## marcolfuck 1.788e+01 8.827e+02 0.020 0.983836
## cunts -1.196e+00 5.115e-01 -2.338 0.019409 *
## penissmall 1.463e+01 8.827e+02 0.017 0.986773
## nice -1.238e-01 1.563e-01 -0.792 0.428261
## loser 6.104e-01 1.872e-01 3.260 0.001116 **
## bot -4.261e-01 1.217e-01 -3.502 0.000461 ***
## god 8.184e-02 1.579e-01 0.518 0.604311
## fack 6.044e+00 1.777e+00 3.401 0.000672 ***
## homeland 4.242e-01 1.141e+00 0.372 0.710000
## securityfuck 1.867e+01 8.827e+02 0.021 0.983124
## basteredbastered 1.746e+01 8.827e+02 0.020 0.984216
## arse 1.413e+00 2.242e-01 6.304 2.91e-10 ***
## veggietales 1.293e+00 2.841e+00 0.455 0.649146
## ancestryfuckoffjewish 1.730e+01 8.827e+02 0.020 0.984362
## ur -2.437e-01 4.065e-02 -5.996 2.03e-09 ***
## alone 5.309e-01 1.553e-01 3.418 0.000631 ***
## crap 1.871e+00 1.232e-01 15.188 < 2e-16 ***
## takes -3.320e-01 2.507e-01 -1.324 0.185390
## banned -5.562e-03 2.098e-01 -0.027 0.978850
## robert -1.212e-01 4.588e-01 -0.264 0.791592
## sucku 9.929e-01 1.197e+00 0.829 0.406985
## spanish -2.030e-01 4.237e-01 -0.479 0.631843
## bloody 1.195e+00 2.789e-01 4.285 1.83e-05 ***
## licker 6.645e-01 7.355e-01 0.903 0.366293
## f 6.139e-01 4.675e-02 13.133 < 2e-16 ***
## dirty 1.690e+00 2.613e-01 6.468 9.96e-11 ***
## deleting 3.554e-02 1.766e-01 0.201 0.840534
## whore 2.448e+00 2.980e-01 8.214 < 2e-16 ***
## ullmann 7.781e-01 2.557e+00 0.304 0.760936
## atheist -3.968e-01 5.419e-01 -0.732 0.464021
## shitfuck 1.048e+01 2.558e+02 0.041 0.967335
## chicken 4.659e-02 4.766e-01 0.098 0.922117
## yeah 2.879e-01 1.560e-01 1.845 0.065022 .
## centraliststupid 1.692e+01 8.827e+02 0.019 0.984711
## fan1967 -5.776e+00 3.162e+01 -0.183 0.855046
## fired 6.572e-01 6.222e-01 1.056 0.290791
## vagina 2.532e+00 3.567e-01 7.101 1.24e-12 ***
## nigga 3.609e+00 3.476e-01 10.383 < 2e-16 ***
## lick 2.036e-01 1.989e-01 1.023 0.306143
## ha -6.621e-01 3.838e-02 -17.252 < 2e-16 ***
## loves 2.138e-01 3.703e-01 0.577 0.563775
## ricehey -1.056e+00 6.305e+00 -0.167 0.867052
## hes -5.566e-01 9.330e-02 -5.966 2.43e-09 ***
## fun -1.995e-02 1.611e-01 -0.124 0.901430
## drink 3.031e-01 3.652e-01 0.830 0.406505
## live 2.177e-02 1.361e-01 0.160 0.872950
## pathetic 6.097e-01 2.003e-01 3.045 0.002328 **
## motherfucker -4.909e-01 6.125e-01 -0.802 0.422838
## fire -5.453e-02 2.733e-01 -0.200 0.841862
## mum 4.624e-01 2.876e-01 1.608 0.107825
## face 7.385e-01 1.352e-01 5.461 4.74e-08 ***
## head 8.584e-01 1.062e-01 8.081 6.45e-16 ***
## moron 1.753e+00 1.630e-01 10.757 < 2e-16 ***
## son -4.821e-01 6.653e-02 -7.247 4.26e-13 ***
## bleachanhero 1.010e+01 8.827e+02 0.011 0.990870
## ya -5.184e-04 1.079e-01 -0.005 0.996166
## dicks -4.283e-01 3.635e-01 -1.178 0.238708
## c 5.255e-01 5.435e-02 9.669 < 2e-16 ***
## jews 1.143e-01 3.345e-01 0.342 0.732633
## bitches 3.997e-01 4.325e-01 0.924 0.355444
## seriously 5.344e-01 3.028e-01 1.765 0.077579 .
## useredgar181 3.516e+00 1.184e+00 2.969 0.002989 **
## homo 6.386e-01 2.787e-01 2.291 0.021951 *
## foolwhat 1.517e+01 8.827e+02 0.017 0.986289
## bitchmattythewhite 1.150e+01 8.827e+02 0.013 0.989603
## dumbass 1.656e+00 3.194e-01 5.184 2.18e-07 ***
## balls 2.233e+00 2.151e-01 10.382 < 2e-16 ***
## gonna 9.823e-01 1.792e-01 5.483 4.18e-08 ***
## fck 4.414e+00 4.001e-01 11.030 < 2e-16 ***
## guy -1.445e-01 1.580e-01 -0.915 0.360438
## jerk 2.472e+00 1.808e-01 13.670 < 2e-16 ***
## reading -1.863e-01 2.145e-01 -0.868 0.385258
## everyone -4.000e-01 1.723e-01 -2.321 0.020284 *
## yaaaaah 1.744e+01 8.841e+02 0.020 0.984259
## yaaa -6.990e+00 4.941e+01 -0.141 0.887505
## shithole 2.229e+00 9.383e-01 2.376 0.017510 *
## internet 2.941e-01 1.887e-01 1.559 0.119045
## haahhahahah 1.130e-01 1.892e+00 0.060 0.952385
## ugly 9.293e-01 2.614e-01 3.555 0.000378 ***
## racist 5.581e-01 1.837e-01 3.037 0.002386 **
## fucked 4.316e+00 2.776e-01 15.546 < 2e-16 ***
## administratorprick 1.620e+01 8.827e+02 0.018 0.985360
## whatever 5.988e-02 1.764e-01 0.339 0.734329
## havent -5.703e-01 2.488e-01 -2.292 0.021914 *
## murder 1.563e-01 3.249e-01 0.481 0.630536
## `8dpenis` 1.452e+01 8.827e+02 0.016 0.986874
## messages -1.851e-01 2.620e-01 -0.706 0.479904
## piss 1.244e+00 1.871e-01 6.651 2.90e-11 ***
## california 1.563e-01 4.421e-01 0.354 0.723640
## power -3.465e-01 1.853e-01 -1.870 0.061501 .
## arrest 1.073e+00 5.050e-01 2.125 0.033627 *
## vista -3.096e+00 5.090e+00 -0.608 0.542944
## guess 4.843e-02 1.627e-01 0.298 0.765982
## computeri -6.970e+00 6.007e+02 -0.012 0.990743
## talking 5.190e-02 1.667e-01 0.311 0.755511
## niggers 3.456e+00 4.143e-01 8.341 < 2e-16 ***
## diego -2.160e-01 1.135e+00 -0.190 0.849143
## r -1.116e+00 6.035e-02 -18.485 < 2e-16 ***
## stuff -1.146e-01 1.625e-01 -0.705 0.480666
## job 1.605e-01 1.723e-01 0.931 0.351746
## shitheadi 3.736e+01 9.031e+02 0.041 0.967001
## mesan -1.011e+01 2.631e+02 -0.038 0.969349
## hard -3.474e-02 1.469e-01 -0.236 0.813118
## chula -9.745e+00 4.366e+02 -0.022 0.982192
## along -9.095e-01 2.833e-01 -3.210 0.001326 **
## shitty 2.516e+00 4.308e-01 5.841 5.19e-09 ***
## n -7.966e-01 6.486e-02 -12.282 < 2e-16 ***
## house 7.463e-02 2.318e-01 0.322 0.747523
## dude 5.201e-01 1.849e-01 2.813 0.004904 **
## pneis 1.402e+01 8.827e+02 0.016 0.987324
## pensnsnniensnsn NA NA NA NA
## pennnis NA NA NA NA
## nazi 7.740e-01 1.703e-01 4.544 5.52e-06 ***
## bag 9.628e-01 1.746e-01 5.514 3.50e-08 ***
## white -9.775e-02 2.049e-01 -0.477 0.633330
## twat 2.017e+00 2.952e-01 6.834 8.27e-12 ***
## king -8.836e-02 7.117e-02 -1.241 0.214445
## full -1.007e-01 1.279e-01 -0.787 0.431369
## threats 2.019e-01 3.448e-01 0.585 0.558266
## death 1.129e-01 2.328e-01 0.485 0.627661
## uuuuuu 7.214e-01 8.196e-01 0.880 0.378748
## fffff 1.686e+00 7.253e-01 2.325 0.020090 *
## stay -4.773e-02 1.750e-01 -0.273 0.785041
## mouth 7.473e-01 2.277e-01 3.281 0.001033 **
## itsuck 1.626e+01 8.827e+02 0.018 0.985300
## blocking 5.529e-01 1.856e-01 2.979 0.002892 **
## truth -8.058e-02 1.668e-01 -0.483 0.628985
## sex 9.724e-01 1.519e-01 6.403 1.53e-10 ***
## prick 2.094e+00 2.329e-01 8.995 < 2e-16 ***
## everything -4.023e-01 1.962e-01 -2.050 0.040318 *
## watching 3.916e-02 3.966e-01 0.099 0.921330
## sick 8.278e-01 2.029e-01 4.080 4.51e-05 ***
## knob 1.609e+00 6.465e-01 2.489 0.012817 *
## leaving -8.710e-01 3.867e-01 -2.252 0.024291 *
## kk 1.177e+00 1.965e-01 5.990 2.10e-09 ***
## cheese -2.178e+00 8.360e-01 -2.606 0.009171 **
## yo 9.402e-01 3.957e-02 23.758 < 2e-16 ***
## uu 1.655e-01 3.746e-01 0.442 0.658592
## salt -2.095e+00 1.063e+00 -1.971 0.048764 *
## kkkkkk 4.680e+00 4.285e+00 1.092 0.274703
## fool 8.250e-01 1.799e-01 4.585 4.55e-06 ***
## cccccc 2.493e+00 1.478e+00 1.686 0.091735 .
## quit -4.075e-02 1.398e-01 -0.291 0.770692
## ps -4.053e-01 8.349e-02 -4.854 1.21e-06 ***
## wasnt 2.910e-03 1.802e-01 0.016 0.987114
## sad -2.947e-02 1.780e-01 -0.166 0.868460
## phuq 4.704e+00 1.895e+00 2.482 0.013050 *
## whats -3.433e-01 1.819e-01 -1.887 0.059126 .
## licks -8.394e-02 1.160e+00 -0.072 0.942301
## idiots -6.035e-01 2.332e-01 -2.588 0.009659 **
## whoreeat 1.030e+01 8.827e+02 0.012 0.990692
## edie -5.671e-01 7.306e-01 -0.776 0.437621
## di -5.099e-01 4.104e-02 -12.425 < 2e-16 ***
## dare 7.348e-01 2.337e-01 3.145 0.001663 **
## bbb23 1.224e+00 9.588e-01 1.277 0.201633
## arent -4.033e-01 1.593e-01 -2.532 0.011337 *
## `23` -4.217e-01 1.408e-01 -2.996 0.002740 **
## shes 6.167e-01 2.368e-01 2.604 0.009215 **
## retarded -1.851e+00 3.859e-01 -4.796 1.62e-06 ***
## john -4.908e-01 2.379e-01 -2.063 0.039122 *
## dead -3.647e-01 2.185e-01 -1.669 0.095049 .
## bunch 1.596e-01 2.248e-01 0.710 0.477883
## told 1.236e-01 1.910e-01 0.647 0.517526
## reverting -1.243e-01 1.768e-01 -0.703 0.482048
## neiln 6.487e-01 8.001e-01 0.811 0.417542
## cline -8.409e-01 3.883e-01 -2.166 0.030342 *
## mom 7.719e-01 1.773e-01 4.353 1.34e-05 ***
## due -1.849e-01 2.333e-01 -0.793 0.427899
## cuntfranks 1.382e+01 8.827e+02 0.016 0.987506
## romney -1.043e+01 1.312e+02 -0.079 0.936642
## mitt -8.380e-01 2.764e-01 -3.032 0.002429 **
## coward 7.564e-01 3.354e-01 2.255 0.024141 *
## ahead -4.177e-01 2.345e-01 -1.781 0.074854 .
## chink 1.875e+00 6.553e-01 2.861 0.004228 **
## ruining 5.564e-01 5.565e-01 1.000 0.317402
## calling -2.392e-01 1.981e-01 -1.208 0.227185
## black -1.519e-01 1.963e-01 -0.774 0.438993
## retard 1.560e+00 2.405e-01 6.484 8.93e-11 ***
## assholes -7.454e-01 3.665e-01 -2.034 0.041968 *
## obviously -6.117e-01 2.127e-01 -2.876 0.004026 **
## listen 2.498e-01 2.031e-01 1.230 0.218825
## cause -1.885e-01 7.068e-02 -2.668 0.007640 **
## wtf 2.399e+00 2.102e-01 11.412 < 2e-16 ***
## scum 1.895e+00 2.951e-01 6.424 1.33e-10 ***
## spics 1.553e+00 2.530e+00 0.614 0.539331
## shot -4.903e-01 3.036e-01 -1.615 0.106275
## likes 1.052e+00 2.353e-01 4.472 7.75e-06 ***
## weak -7.353e-01 4.200e-01 -1.750 0.080035 .
## stick 3.611e-01 2.097e-01 1.722 0.085036 .
## minorities -4.464e+00 2.597e+00 -1.719 0.085668 .
## lmao 4.684e-01 4.948e-01 0.947 0.343814
## boy 2.800e-01 1.512e-01 1.852 0.064044 .
## jasenm222 1.626e+00 8.827e+02 0.002 0.998531
## friends 3.356e-01 2.625e-01 1.279 0.201047
## dickfucking NA NA NA NA
## sucking 2.980e+00 4.302e-01 6.928 4.27e-12 ***
## wanna 1.468e+00 1.941e-01 7.562 3.98e-14 ***
## mothers -1.020e+00 6.892e-01 -1.479 0.139033
## gets -1.502e-01 2.196e-01 -0.684 0.493911
## youll -3.973e-01 2.200e-01 -1.806 0.070893 .
## joke -3.373e-02 2.149e-01 -0.157 0.875285
## ignorant 5.558e-01 2.234e-01 2.488 0.012846 *
## family -6.212e-01 2.865e-01 -2.168 0.030144 *
## deal -4.821e-01 2.039e-01 -2.365 0.018048 *
## wow -8.438e-02 2.206e-01 -0.383 0.702063
## njgw 3.502e+00 1.298e+00 2.699 0.006949 **
## misterwiki 4.071e+00 2.210e+00 1.842 0.065425 .
## fuckingabf 1.121e+01 8.827e+02 0.013 0.989868
## douche 2.105e+00 2.563e-01 8.215 < 2e-16 ***
## bongwarriorcongratualtions 7.227e+00 8.827e+02 0.008 0.993468
## lion -4.599e-01 2.648e-01 -1.737 0.082439 .
## game -3.734e-01 1.918e-01 -1.946 0.051610 .
## computer -1.650e-02 2.345e-01 -0.070 0.943908
## completely 6.706e-02 3.193e-01 0.210 0.833663
## threads -4.071e-01 8.451e-01 -0.482 0.629998
## slap 2.155e-01 4.970e-01 0.434 0.664554
## nerd 1.462e+00 2.586e-01 5.655 1.56e-08 ***
## jforget 6.669e+00 8.827e+02 0.008 0.993972
## mods 1.426e+00 5.993e-01 2.380 0.017315 *
## learn -8.737e-01 2.127e-01 -4.108 3.99e-05 ***
## vuvuzelas 1.565e+01 8.827e+02 0.018 0.985855
## raid -2.393e+00 7.019e-01 -3.410 0.000649 ***
## motherfucking -1.962e+00 7.348e-01 -2.670 0.007585 **
## dipshit 4.397e+00 4.210e-01 10.446 < 2e-16 ***
## complete -4.960e-01 2.368e-01 -2.095 0.036158 *
## bestfrozen 1.519e+01 8.827e+02 0.017 0.986270
## act -6.956e-01 7.083e-02 -9.821 < 2e-16 ***
## telling 4.705e-01 2.160e-01 2.178 0.029420 *
## kike -1.698e+00 7.165e-01 -2.370 0.017805 *
## gg 1.228e-01 8.113e-02 1.513 0.130220
## fucks 4.597e+00 4.313e-01 10.659 < 2e-16 ***
## credit -1.739e-01 3.490e-01 -0.498 0.618304
## butt 1.060e+00 1.684e-01 6.298 3.02e-10 ***
## billj 3.670e-01 3.302e+00 0.111 0.911499
## sit -3.534e-01 8.235e-02 -4.292 1.77e-05 ***
## self -1.370e-01 1.019e-01 -1.344 0.178848
## sannse 3.046e+00 3.357e+00 0.907 0.364308
## posted -3.370e-01 2.245e-01 -1.501 0.133285
## angela -4.104e+00 3.332e+00 -1.232 0.218126
## yours 9.696e-01 1.141e-01 8.494 < 2e-16 ***
## home -7.914e-01 2.787e-01 -2.839 0.004521 **
## funny 2.785e-02 2.757e-01 0.101 0.919540
## douchebag -1.514e+00 4.480e-01 -3.379 0.000727 ***
## cool -4.811e-01 2.472e-01 -1.946 0.051648 .
## coming -3.607e-01 2.020e-01 -1.786 0.074148 .
## worthless -7.490e-02 3.703e-01 -0.202 0.839707
## watch -5.231e-01 1.995e-01 -2.622 0.008730 **
## sloppy -2.267e+00 1.133e+00 -2.002 0.045294 *
## play -3.502e-01 1.632e-01 -2.147 0.031826 *
## lifetime 6.954e-01 7.439e-01 0.935 0.349865
## wikipedians 2.518e-02 3.187e-01 0.079 0.937041
## waste 2.747e-01 2.288e-01 1.200 0.230000
## report -2.982e-01 1.559e-01 -1.912 0.055815 .
## libtard 4.617e+00 1.754e+00 2.633 0.008467 **
## fuckbags 4.784e+00 8.827e+02 0.005 0.995676
## dear -6.256e-02 2.202e-01 -0.284 0.776329
## blank -5.600e-01 3.075e-01 -1.821 0.068550 .
## bet -1.271e-01 9.229e-02 -1.377 0.168537
## aint -2.146e-01 1.809e-01 -1.187 0.235368
## vandalize -5.919e-01 1.856e-01 -3.188 0.001431 **
## unblock -3.907e-01 1.941e-01 -2.013 0.044166 *
## tried -8.770e-02 2.176e-01 -0.403 0.686876
## outside -3.394e-01 3.450e-01 -0.984 0.325306
## limpeddicked -6.064e-01 1.036e+03 -0.001 0.999533
## jesus 4.482e-01 2.674e-01 1.676 0.093763 .
## forever 2.251e-02 3.018e-01 0.075 0.940531
## comes -4.086e-01 2.443e-01 -1.673 0.094411 .
## allowed 2.731e-01 2.106e-01 1.297 0.194754
## women 4.107e-01 2.897e-01 1.418 0.156203
## itbitch 1.109e+01 3.771e+02 0.029 0.976528
## heard -3.598e-01 2.502e-01 -1.438 0.150418
## business 1.197e-01 2.274e-01 0.526 0.598631
## semen 3.379e-01 3.012e-01 1.122 0.261790
## pretty -4.331e-01 2.136e-01 -2.028 0.042593 *
## friend -2.424e-01 1.791e-01 -1.353 0.175998
## failed 6.507e-02 3.227e-01 0.202 0.840194
## bush 1.705e-01 3.567e-01 0.478 0.632553
## band -1.888e-01 2.262e-01 -0.835 0.403982
## nobody -4.721e-01 2.743e-01 -1.721 0.085164 .
## cum 4.006e-01 1.916e-01 2.091 0.036573 *
## sweet -1.062e+00 4.656e-01 -2.280 0.022590 *
## steal 5.671e-01 4.257e-01 1.332 0.182827
## respect -2.402e-01 2.025e-01 -1.186 0.235544
## nate -9.702e-01 1.947e-01 -4.983 6.27e-07 ***
## lets -4.232e-01 2.131e-01 -1.986 0.047066 *
## hole 6.877e-01 1.170e-01 5.878 4.16e-09 ***
## filter -4.135e-01 7.371e-01 -0.561 0.574797
## dust -7.018e-01 4.872e-01 -1.440 0.149736
## mr -2.722e-01 1.951e-01 -1.395 0.163049
## couriano 4.983e+00 1.498e+00 3.327 0.000878 ***
## wouldnt -5.046e-01 2.353e-01 -2.145 0.031988 *
## wait -2.077e-01 2.030e-01 -1.023 0.306135
## peoples -4.570e-01 2.695e-01 -1.696 0.089897 .
## jackass 2.506e+00 3.079e-01 8.140 3.95e-16 ***
## high -7.989e-01 1.794e-01 -4.453 8.45e-06 ***
## entire -5.792e-01 2.051e-01 -2.824 0.004739 **
## deserve 6.623e-03 2.244e-01 0.030 0.976450
## country -1.063e+00 2.778e-01 -3.829 0.000129 ***
## single -4.154e-01 2.308e-01 -1.800 0.071850 .
## rest -7.573e-01 1.228e-01 -6.166 7.03e-10 ***
## parents 4.940e-01 3.983e-01 1.240 0.214873
## okay -3.681e-01 2.452e-01 -1.501 0.133383
## fine -5.828e-01 1.857e-01 -3.139 0.001698 **
## wanted -5.613e-01 2.145e-01 -2.617 0.008863 **
## night -2.159e-01 2.084e-01 -1.036 0.300231
## looks -6.544e-01 2.173e-01 -3.012 0.002596 **
## human -5.194e-01 2.223e-01 -2.336 0.019484 *
## homosexual 2.658e-02 3.812e-01 0.070 0.944417
## false -2.640e-01 2.165e-01 -1.219 0.222719
## faggotjéské 7.261e+00 8.827e+02 0.008 0.993437
## came -4.500e-01 2.021e-01 -2.226 0.025989 *
## burn 5.387e-01 2.339e-01 2.303 0.021259 *
## small -3.887e-01 2.318e-01 -1.677 0.093533 .
## rvv 1.508e+00 1.246e+00 1.211 0.226069
## pig 1.596e+00 2.165e-01 7.374 1.66e-13 ***
## password -2.417e+00 1.045e+00 -2.313 0.020729 *
## girl 2.542e-01 1.957e-01 1.299 0.194079
## attention -2.713e-01 2.411e-01 -1.125 0.260506
## anymore -4.336e-01 2.800e-01 -1.549 0.121482
## vandal -2.037e-01 1.009e-01 -2.018 0.043580 *
## theyre 1.728e-01 2.234e-01 0.774 0.439154
## slut 3.500e+00 4.633e-01 7.555 4.20e-14 ***
## remember -3.485e-01 2.244e-01 -1.553 0.120416
## past 8.284e-03 1.798e-01 0.046 0.963251
## nl33ers 4.798e+00 1.419e+00 3.381 0.000722 ***
## metal -5.435e-01 3.842e-01 -1.415 0.157174
## kiss 1.577e+00 2.461e-01 6.407 1.49e-10 ***
## chuck -9.311e-01 1.025e+00 -0.909 0.363517
## abuse 3.874e-01 2.076e-01 1.866 0.062015 .
## hand -3.779e-01 1.709e-01 -2.212 0.026966 *
## goodbye 2.615e-01 4.786e-01 0.546 0.584851
## gave -3.215e-01 2.448e-01 -1.313 0.189159
## enjoy -6.277e-01 2.231e-01 -2.814 0.004900 **
## administrator -1.760e-01 1.826e-01 -0.964 0.335119
## wales 2.716e-01 3.072e-01 0.884 0.376607
## vandalizing 6.059e-01 2.542e-01 2.383 0.017151 *
## posting 2.887e-01 2.317e-01 1.246 0.212764
## o -1.633e-03 9.639e-02 -0.017 0.986486
## lost 9.498e-02 2.385e-01 0.398 0.690414
## himself 1.984e-01 2.575e-01 0.771 0.440992
## blah 9.706e-01 3.987e-01 2.435 0.014911 *
## biased -2.011e-01 2.519e-01 -0.798 0.424675
## total -4.139e-01 2.080e-01 -1.990 0.046605 *
## shove 9.599e-01 3.589e-01 2.675 0.007477 **
## screw 9.076e-01 2.430e-01 3.735 0.000187 ***
## kid -4.482e-02 1.797e-01 -0.249 0.803026
## fight -2.237e-01 2.017e-01 -1.109 0.267275
## cut -1.402e-01 1.839e-01 -0.762 0.445879
## couldnt -4.064e-01 2.769e-01 -1.467 0.142244
## taken -5.790e-01 2.261e-01 -2.560 0.010460 *
## soon -8.939e-01 2.492e-01 -3.587 0.000334 ***
## sock -1.865e-01 1.604e-01 -1.162 0.245070
## serious -3.525e-01 2.514e-01 -1.402 0.160926
## proof -3.678e-01 2.483e-01 -1.481 0.138569
## posts -2.892e-01 3.069e-01 -0.942 0.345977
## hours -5.240e-01 2.854e-01 -1.836 0.066409 .
## goes -9.798e-01 2.850e-01 -3.438 0.000585 ***
## goddamn -2.792e-01 4.511e-01 -0.619 0.535950
## biggest -4.872e-01 3.963e-01 -1.230 0.218879
## troll -2.462e-02 1.833e-01 -0.134 0.893179
## shouldnt -4.452e-01 2.430e-01 -1.832 0.066878 .
## mine -6.379e-01 1.991e-01 -3.203 0.001359 **
## lies -3.794e-01 1.947e-01 -1.948 0.051407 .
## gives -5.943e-02 2.900e-01 -0.205 0.837620
## worse -2.315e-01 3.244e-01 -0.713 0.475543
## supertr0ll 7.278e-01 1.245e+00 0.584 0.558993
## s -1.469e-01 6.981e-02 -2.104 0.035378 *
## rule -4.133e-01 1.563e-01 -2.644 0.008191 **
## raped 6.561e-01 4.424e-01 1.483 0.138127
## poor 1.655e-01 2.339e-01 0.708 0.479100
## men -8.449e-01 6.521e-02 -12.958 < 2e-16 ***
## gone -3.543e-02 2.451e-01 -0.145 0.885042
## fucky 3.514e+00 8.245e-01 4.261 2.03e-05 ***
## filthy 2.493e+00 3.689e-01 6.757 1.41e-11 ***
## eyes 2.086e-01 2.851e-01 0.732 0.464465
## edited -4.657e-01 2.311e-01 -2.015 0.043891 *
## wants -3.995e-01 2.755e-01 -1.450 0.147057
## money 2.830e-01 2.717e-01 1.041 0.297646
## brain -2.271e-01 2.633e-01 -0.863 0.388299
## ago -3.640e-01 1.754e-01 -2.075 0.037989 *
## `4` -2.641e-01 6.359e-02 -4.152 3.29e-05 ***
## warnings 3.756e-01 2.476e-01 1.517 0.129261
## usernhrhs2010 2.008e-01 5.263e+02 0.000 0.999696
## took -4.172e-01 2.370e-01 -1.760 0.078392 .
## taking -2.018e-01 2.320e-01 -0.870 0.384335
## sir 2.367e-02 2.199e-01 0.108 0.914298
## run -5.744e-01 1.735e-01 -3.310 0.000933 ***
## mccain 7.375e-02 1.228e+00 0.060 0.952130
## insult -2.392e-01 2.152e-01 -1.112 0.266262
## favor 6.061e-01 2.296e-01 2.639 0.008306 **
## bother 7.754e-01 2.259e-01 3.432 0.000599 ***
## acting 4.907e-01 2.569e-01 1.910 0.056100 .
## `17` 1.760e-01 1.145e-01 1.537 0.124344
## yourselves 6.295e-01 3.556e-01 1.770 0.076722 .
## writing -4.955e-01 2.187e-01 -2.266 0.023458 *
## userenigmaman 1.457e+01 5.097e+02 0.029 0.977199
## together -2.459e-01 2.570e-01 -0.957 0.338560
## saliva -2.999e-01 1.582e+00 -0.190 0.849625
## playing -1.479e-01 3.726e-01 -0.397 0.691414
## names -1.065e+00 2.751e-01 -3.870 0.000109 ***
## kurt 1.275e+00 6.283e-01 2.029 0.042447 *
## juicy 2.311e+00 8.976e-01 2.575 0.010033 *
## haha 1.355e+00 1.642e-01 8.251 < 2e-16 ***
## fcking 1.061e+00 7.745e-01 1.370 0.170581
## exactly -1.253e-01 2.507e-01 -0.500 0.617337
## cuz 4.212e-01 3.554e-01 1.185 0.235901
## constructed -1.119e-01 1.175e+00 -0.095 0.924141
## child -1.765e-01 1.883e-01 -0.938 0.348379
## bald 5.357e-01 6.011e-01 0.891 0.372759
## went -2.444e-01 2.298e-01 -1.063 0.287564
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## (Dispersion parameter for binomial family taken to be 1)
##
## Null deviance: 66096 on 159570 degrees of freedom
## Residual deviance: 30214 on 159103 degrees of freedom
## AIC: 31150
##
## Number of Fisher Scoring iterations: 13
confusion_data(obs_reg)
## Maximum accuracy is acheived at a cutoff of: 0.39

##
## Confusion Matrix and Statistics
##
## Reference
## Prediction 0 1
## 0 149897 3291
## 1 1225 5158
##
## Accuracy : 0.9717
## 95% CI : (0.9709, 0.9725)
## No Information Rate : 0.9471
## P-Value [Acc > NIR] : < 2.2e-16
##
## Kappa : 0.6810
## Mcnemar's Test P-Value : < 2.2e-16
##
## Sensitivity : 0.9919
## Specificity : 0.6105
## Pos Pred Value : 0.9785
## Neg Pred Value : 0.8081
## Prevalence : 0.9471
## Detection Rate : 0.9394
## Detection Prevalence : 0.9600
## Balanced Accuracy : 0.8012
## F-val Accuracy : 0.9852
##
## 'Positive' Class : 0
summary(thr_reg)
##
## Call:
## glm(formula = threat ~ ., family = binomial(link = "logit"),
## data = thr_tmp)
##
## Deviance Residuals:
## Min 1Q Median 3Q Max
## -3.1111 -0.0647 -0.0606 -0.0461 4.0820
##
## Coefficients:
## Estimate Std. Error z value Pr(>|z|)
## (Intercept) -6.1688 0.0741 -83.251 < 2e-16 ***
## kill 2.9191 0.1276 22.877 < 2e-16 ***
## jim -0.3212 0.5969 -0.538 0.590466
## wales 0.4686 0.7977 0.587 0.556925
## supertr0ll 38.8077 5380.6861 0.007 0.994245
## ban -1.4845 0.3528 -4.208 2.57e-05 ***
## murder -0.1479 0.3726 -0.397 0.691379
## live 0.6553 0.2110 3.106 0.001898 **
## fuckin 2.1458 0.1565 13.709 < 2e-16 ***
## rvv 3.9420 1.2710 3.101 0.001926 **
## blank -1.5612 1.2665 -1.233 0.217673
## edie -1.1757 0.9183 -1.280 0.200415
## di -0.6778 0.1051 -6.446 1.15e-10 ***
## pathetic -0.4018 0.5535 -0.726 0.467936
## forever 1.0596 0.5986 1.770 0.076709 .
## respect -13.8429 198.9552 -0.070 0.944530
## fool 0.1348 0.5331 0.253 0.800434
## bitch 0.8568 0.2341 3.660 0.000252 ***
## lifetime -15.0969 909.7709 -0.017 0.986760
## filter 0.7297 1.2325 0.592 0.553821
## dust -1.8689 1.2575 -1.486 0.137214
## steal -0.8211 0.8865 -0.926 0.354348
## password 0.3453 1.2482 0.277 0.782046
## gonna 1.7985 0.2837 6.339 2.32e-10 ***
## rape 2.1406 0.2272 9.423 < 2e-16 ***
## youcaltlas 2.0153 15208.4711 0.000 0.999894
## hell 0.5931 0.1837 3.230 0.001239 **
## death 1.2668 0.2201 5.757 8.58e-09 ***
## fat 0.1074 0.2944 0.365 0.715207
## stupid 0.5919 0.2557 2.314 0.020643 *
## wanta -12.9255 5347.5757 -0.002 0.998071
## simpson -13.7421 892.6967 -0.015 0.987718
## piece 0.7558 0.2513 3.008 0.002634 **
## niggaz 3.2051 1.2898 2.485 0.012960 *
## jessica -13.3351 1481.5848 -0.009 0.992819
## butthead -13.6288 5347.8378 -0.003 0.997967
## beavis -0.2062 7476.8517 0.000 0.999978
## bail 0.6324 1.1202 0.565 0.572399
## moonshine -16.2935 6747.9450 -0.002 0.998073
## `420` 0.5407 1.0111 0.535 0.592829
## head 0.5527 0.2014 2.744 0.006075 **
## fuckunblocklifetime 105.3707 14862.8310 0.007 0.994343
## dead 0.5482 0.2690 2.038 0.041553 *
## caltlas 19.9042 10754.0131 0.002 0.998523
## faggot 1.4030 0.2714 5.169 2.36e-07 ***
## house 1.0883 0.2504 4.347 1.38e-05 ***
## shoot 1.6036 0.3191 5.026 5.02e-07 ***
## face 0.7413 0.2488 2.979 0.002895 **
## dick 0.3350 0.3423 0.979 0.327660
## cunt 0.4169 0.3100 1.345 0.178735
## ya -0.7332 0.2914 -2.516 0.011884 *
## burn 1.2797 0.2961 4.322 1.55e-05 ***
## mother 0.5772 0.2388 2.417 0.015653 *
## family 0.2967 0.3074 0.965 0.334489
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## (Dispersion parameter for binomial family taken to be 1)
##
## Null deviance: 6509.5 on 159570 degrees of freedom
## Residual deviance: 5053.1 on 159517 degrees of freedom
## AIC: 5161.1
##
## Number of Fisher Scoring iterations: 18
confusion_data(thr_reg)
## Maximum accuracy is acheived at a cutoff of: 0.88

##
## Confusion Matrix and Statistics
##
## Reference
## Prediction 0 1
## 0 159088 467
## 1 5 11
##
## Accuracy : 0.9970
## 95% CI : (0.9968, 0.9973)
## No Information Rate : 0.9970
## P-Value [Acc > NIR] : 0.4033
##
## Kappa : 0.0443
## Mcnemar's Test P-Value : < 2.2e-16
##
## Sensitivity : 1.0000
## Specificity : 0.0230
## Pos Pred Value : 0.9971
## Neg Pred Value : 0.6875
## Prevalence : 0.9970
## Detection Rate : 0.9970
## Detection Prevalence : 0.9999
## Balanced Accuracy : 0.5115
## F-val Accuracy : 0.9985
##
## 'Positive' Class : 0
summary(ins_reg)
##
## Call:
## glm(formula = insult ~ ., family = binomial(link = "logit"),
## data = ins_tmp)
##
## Deviance Residuals:
## Min 1Q Median 3Q Max
## -6.6867 -0.2048 -0.1329 -0.0770 4.9449
##
## Coefficients: (1 not defined because of singularities)
## Estimate Std. Error z value Pr(>|z|)
## (Intercept) -2.406e+00 1.005e-01 -23.932 < 2e-16 ***
## fat 1.197e+00 1.202e-01 9.961 < 2e-16 ***
## faggot 1.569e+00 2.282e-01 6.875 6.21e-12 ***
## moron 2.607e+00 1.568e-01 16.623 < 2e-16 ***
## cunt 3.197e+00 1.480e-01 21.608 < 2e-16 ***
## bitch 3.972e+00 1.226e-01 32.399 < 2e-16 ***
## jew 8.160e-01 1.771e-01 4.606 4.10e-06 ***
## stupid 2.574e+00 8.456e-02 30.435 < 2e-16 ***
## sucks 1.746e+00 2.163e-01 8.073 6.89e-16 ***
## dick 3.224e+00 1.145e-01 28.165 < 2e-16 ***
## asshole 3.535e+00 1.778e-01 19.875 < 2e-16 ***
## piece 1.568e+00 1.227e-01 12.779 < 2e-16 ***
## dickhead 2.960e-01 3.475e-01 0.852 0.394347
## fucker 4.003e+00 2.537e-01 15.777 < 2e-16 ***
## cock 2.204e+00 1.525e-01 14.453 < 2e-16 ***
## faggots -7.189e-01 3.926e-01 -1.831 0.067068 .
## bastard 3.320e+00 1.873e-01 17.731 < 2e-16 ***
## yourselfgo 1.642e+01 6.131e+02 0.027 0.978628
## cocksucker 2.631e+00 6.907e-01 3.809 0.000139 ***
## idiot 3.993e+00 9.551e-02 41.806 < 2e-16 ***
## huge -9.242e-02 2.742e-01 -0.337 0.736100
## damn 7.798e-01 1.725e-01 4.520 6.19e-06 ***
## mothjer 8.318e+00 3.948e+02 0.021 0.983190
## hell 2.617e-01 8.715e-02 3.003 0.002676 **
## dog 7.180e-01 1.838e-01 3.907 9.33e-05 ***
## eat -4.060e-01 7.073e-02 -5.741 9.43e-09 ***
## pussy 1.535e+00 2.788e-01 5.506 3.66e-08 ***
## mother 7.360e-01 1.802e-01 4.083 4.44e-05 ***
## d -3.820e-01 5.211e-02 -7.330 2.31e-13 ***
## mexicans 1.026e+00 8.253e-01 1.243 0.213853
## fggt 2.896e+00 7.138e-01 4.057 4.97e-05 ***
## fuckin 2.905e+00 8.066e-02 36.017 < 2e-16 ***
## proassadhanibal911youre 1.474e+01 5.097e+02 0.029 0.976922
## niggas -2.831e-01 1.018e+00 -0.278 0.780952
## bitchesfuck 1.288e+01 8.827e+02 0.015 0.988354
## god 1.261e-01 1.445e-01 0.873 0.382823
## shut 1.602e+00 1.509e-01 10.618 < 2e-16 ***
## cocks -1.202e+00 5.714e-01 -2.104 0.035405 *
## fag 2.580e+00 1.505e-01 17.145 < 2e-16 ***
## dumb 2.368e+00 1.515e-01 15.626 < 2e-16 ***
## youfuck 1.789e+01 2.932e+02 0.061 0.951356
## bitchfuck 9.756e+00 3.893e+02 0.025 0.980008
## ban 7.392e-02 1.209e-01 0.611 0.541011
## notrhbysouthbanof 1.618e+01 5.097e+02 0.032 0.974678
## loser 2.091e+00 1.551e-01 13.479 < 2e-16 ***
## wanker 2.302e+00 2.848e-01 8.081 6.40e-16 ***
## guys -1.021e-01 2.035e-01 -0.502 0.615954
## cocksucking -2.127e+00 9.212e-01 -2.309 0.020956 *
## admins -9.533e-02 1.772e-01 -0.538 0.590693
## bunksteve 1.774e+01 8.827e+02 0.020 0.983965
## assfuck 1.491e+00 1.347e+00 1.107 0.268455
## useless 4.673e-01 2.491e-01 1.876 0.060692 .
## pathetic 1.795e+00 1.547e-01 11.601 < 2e-16 ***
## penissmall 1.550e+01 8.827e+02 0.018 0.985993
## cunts -2.804e-01 4.356e-01 -0.644 0.519840
## retarded -1.024e+00 2.996e-01 -3.419 0.000628 ***
## bot -5.845e-01 1.255e-01 -4.657 3.21e-06 ***
## tommy2010 3.282e+00 1.310e+00 2.506 0.012227 *
## basteredbastered 1.662e+01 8.827e+02 0.019 0.984976
## ur -1.981e-01 3.871e-02 -5.118 3.09e-07 ***
## veggietales 2.044e+00 1.951e+00 1.048 0.294786
## ancestryfuckoffjewish 1.720e+01 8.827e+02 0.019 0.984456
## spanish -1.942e-01 4.020e-01 -0.483 0.628943
## kill 5.552e-01 1.289e-01 4.308 1.65e-05 ***
## dirty 1.878e+00 2.326e-01 8.073 6.86e-16 ***
## cheese -1.183e+00 6.401e-01 -1.849 0.064474 .
## bloody 1.493e+00 2.633e-01 5.669 1.43e-08 ***
## robert -4.683e-01 4.738e-01 -0.989 0.322896
## sucku 2.455e+00 9.893e-01 2.481 0.013086 *
## nice -4.382e-01 1.646e-01 -2.662 0.007767 **
## licker 1.514e+00 6.713e-01 2.256 0.024099 *
## deleting 1.474e-01 1.603e-01 0.919 0.357972
## banned 1.454e-01 2.038e-01 0.714 0.475472
## ullmann 1.689e+00 1.483e+00 1.138 0.254919
## chicken 7.087e-01 4.190e-01 1.692 0.090740 .
## atheist 2.684e-01 4.615e-01 0.582 0.560897
## alone 2.990e-01 1.531e-01 1.953 0.050858 .
## whore 2.018e+00 2.967e-01 6.801 1.04e-11 ***
## shitfuck 1.141e+01 2.665e+02 0.043 0.965849
## fool 1.520e+00 1.517e-01 10.018 < 2e-16 ***
## fired 1.367e+00 5.012e-01 2.728 0.006377 **
## centraliststupid 1.618e+01 8.827e+02 0.018 0.985374
## fan1967 -2.276e+00 5.796e+00 -0.393 0.694579
## bush 6.106e-03 3.840e-01 0.016 0.987313
## nigga 3.710e+00 3.391e-01 10.940 < 2e-16 ***
## live -1.170e-01 1.483e-01 -0.789 0.430152
## lick -3.622e-01 2.260e-01 -1.603 0.108925
## hes -3.861e-01 8.590e-02 -4.495 6.96e-06 ***
## ricehey -7.573e-01 4.038e+00 -0.188 0.851253
## fire -5.071e-02 2.638e-01 -0.192 0.847579
## f 1.348e-01 4.368e-02 3.086 0.002030 **
## racist 9.055e-01 1.589e-01 5.700 1.20e-08 ***
## guy 3.283e-01 1.359e-01 2.416 0.015697 *
## arse 5.782e-01 2.376e-01 2.434 0.014950 *
## ugly 1.970e+00 2.167e-01 9.093 < 2e-16 ***
## supertr0ll 1.457e+01 4.414e+02 0.033 0.973662
## head 8.251e-01 1.019e-01 8.094 5.79e-16 ***
## penis 2.125e+00 1.865e-01 11.394 < 2e-16 ***
## bag 8.535e-01 1.646e-01 5.187 2.14e-07 ***
## homo 1.265e+00 2.486e-01 5.089 3.61e-07 ***
## idiots -5.514e-01 1.937e-01 -2.847 0.004419 **
## jews -4.902e-01 2.954e-01 -1.660 0.096978 .
## c 1.514e-01 5.091e-02 2.973 0.002948 **
## takes -3.692e-01 2.434e-01 -1.517 0.129361
## scum 2.764e+00 2.158e-01 12.810 < 2e-16 ***
## face 7.660e-01 1.298e-01 5.900 3.63e-09 ***
## useredgar181 3.001e+00 1.177e+00 2.550 0.010769 *
## son -4.938e-01 6.350e-02 -7.776 7.47e-15 ***
## mum 5.363e-01 2.724e-01 1.969 0.048955 *
## george -3.287e-01 3.685e-01 -0.892 0.372454
## foolwhat 1.492e+01 8.827e+02 0.017 0.986518
## bitchmattythewhite 1.306e+01 8.827e+02 0.015 0.988194
## jerk 2.698e+00 1.696e-01 15.913 < 2e-16 ***
## ya 1.116e-01 1.003e-01 1.113 0.265797
## motherfucker -9.053e-01 4.127e-01 -2.193 0.028279 *
## `repeat` -5.497e-01 2.551e-01 -2.155 0.031197 *
## everyone -1.103e-01 1.486e-01 -0.742 0.458005
## bitches 2.154e-01 4.127e-01 0.522 0.601777
## yaaaaah 1.404e+01 8.828e+02 0.016 0.987310
## yaaa -4.265e+00 1.199e+01 -0.356 0.721957
## haahhahahah 2.581e+00 1.281e+00 2.014 0.044005 *
## dicks -7.312e-01 3.517e-01 -2.079 0.037621 *
## crap 7.710e-01 1.474e-01 5.229 1.70e-07 ***
## dumbass 5.164e-01 3.129e-01 1.650 0.098906 .
## daedalus969 -9.006e+00 2.160e+02 -0.042 0.966737
## biznitch 2.852e+01 9.088e+02 0.031 0.974961
## administratorprick 1.669e+01 8.827e+02 0.019 0.984913
## nazi 1.269e+00 1.439e-01 8.820 < 2e-16 ***
## gonna 9.373e-01 1.745e-01 5.371 7.83e-08 ***
## yeah 4.096e-02 1.609e-01 0.255 0.799040
## bullshit 9.547e-01 1.946e-01 4.907 9.24e-07 ***
## seriously 3.952e-01 3.002e-01 1.316 0.188051
## reading -6.867e-01 2.310e-01 -2.972 0.002954 **
## chocobos 1.827e+01 5.926e+02 0.031 0.975411
## havent -5.961e-01 2.452e-01 -2.431 0.015038 *
## respect -1.849e-01 1.876e-01 -0.986 0.324355
## forever 5.039e-02 2.895e-01 0.174 0.861818
## guess 2.441e-01 1.508e-01 1.619 0.105486
## retard 2.858e+00 2.072e-01 13.791 < 2e-16 ***
## cougar 2.306e+00 6.904e-01 3.341 0.000836 ***
## vista -2.312e+00 3.306e+00 -0.699 0.484381
## computeri -7.910e+00 6.128e+02 -0.013 0.989700
## arrest 1.457e+00 4.622e-01 3.152 0.001623 **
## messages -1.939e-01 2.491e-01 -0.779 0.436190
## california -8.950e-01 6.581e-01 -1.360 0.173843
## diego -4.220e-01 1.173e+00 -0.360 0.719107
## bunch 4.725e-01 2.063e-01 2.290 0.022000 *
## truth -4.181e-02 1.553e-01 -0.269 0.787692
## niggers 3.127e+00 4.066e-01 7.690 1.47e-14 ***
## job 8.464e-02 1.637e-01 0.517 0.605079
## coward 2.135e+00 2.446e-01 8.730 < 2e-16 ***
## shitheadi 3.943e+01 9.414e+02 0.042 0.966587
## mesan -1.000e+01 2.782e+02 -0.036 0.971323
## dude 8.451e-01 1.673e-01 5.053 4.36e-07 ***
## chula -8.490e+00 4.884e+02 -0.017 0.986131
## ha -7.405e-01 3.727e-02 -19.871 < 2e-16 ***
## along -6.607e-01 2.456e-01 -2.690 0.007145 **
## sick 1.084e+00 1.851e-01 5.857 4.72e-09 ***
## sad 2.668e-01 1.518e-01 1.758 0.078819 .
## r -5.898e-01 6.189e-02 -9.530 < 2e-16 ***
## mouth 1.216e+00 2.038e-01 5.965 2.45e-09 ***
## internet -7.389e-02 1.901e-01 -0.389 0.697468
## ignorant 1.157e+00 1.845e-01 6.273 3.54e-10 ***
## whatever -2.363e-01 1.738e-01 -1.359 0.174045
## twat 1.653e+00 2.801e-01 5.900 3.63e-09 ***
## uuuuuu 1.186e+00 7.303e-01 1.623 0.104512
## fffff 1.131e+00 7.397e-01 1.528 0.126413
## leaving -7.273e-02 3.011e-01 -0.242 0.809152
## cougaryou 1.562e+01 8.827e+02 0.018 0.985878
## prick 1.914e+00 2.265e-01 8.451 < 2e-16 ***
## yo 1.290e+00 3.993e-02 32.314 < 2e-16 ***
## threats -5.998e-01 3.913e-01 -1.533 0.125283
## stuff -1.619e-01 1.662e-01 -0.974 0.329917
## shitty 1.364e+00 4.557e-01 2.993 0.002763 **
## house -3.287e-01 2.450e-01 -1.342 0.179660
## uu 2.001e-01 3.747e-01 0.534 0.593269
## reverting 2.400e-01 1.558e-01 1.541 0.123337
## piss 4.212e-01 1.981e-01 2.126 0.033478 *
## kkkkkk 1.966e+00 1.250e+00 1.574 0.115557
## kk 6.868e-01 2.143e-01 3.205 0.001350 **
## cccccc 2.446e+00 1.198e+00 2.042 0.041173 *
## white -2.137e-01 1.927e-01 -1.110 0.267214
## douche 2.611e+00 2.400e-01 10.877 < 2e-16 ***
## death -6.704e-02 2.284e-01 -0.294 0.769118
## blocking 2.210e-01 1.811e-01 1.220 0.222366
## vandal -3.397e-02 9.222e-02 -0.368 0.712611
## full -2.088e-01 1.289e-01 -1.620 0.105219
## power -4.757e-01 1.728e-01 -2.753 0.005908 **
## gayfrozen 1.817e+01 8.827e+02 0.021 0.983582
## licks 2.609e-01 1.004e+00 0.260 0.795056
## di -5.300e-01 3.982e-02 -13.309 < 2e-16 ***
## arent -4.132e-01 1.400e-01 -2.952 0.003154 **
## `23` -4.522e-01 1.385e-01 -3.266 0.001092 **
## whoreeat 1.131e+01 8.827e+02 0.013 0.989780
## romney 2.142e+00 9.842e-01 2.176 0.029541 *
## mitt -5.905e-01 2.531e-01 -2.333 0.019659 *
## edie -1.757e+00 8.690e-01 -2.021 0.043231 *
## talking -2.572e-01 1.589e-01 -1.619 0.105434
## neiln 1.400e+00 7.144e-01 1.959 0.050079 .
## bbb23 1.941e+00 8.170e-01 2.376 0.017521 *
## stay -4.008e-01 1.877e-01 -2.135 0.032767 *
## gayfag -1.378e+01 6.214e+02 -0.022 0.982310
## game -4.745e-01 1.878e-01 -2.526 0.011521 *
## friggen -1.139e+01 4.188e+02 -0.027 0.978314
## black 2.007e-01 1.750e-01 1.147 0.251438
## whats -1.659e-01 1.653e-01 -1.004 0.315564
## john -5.108e-01 2.260e-01 -2.260 0.023793 *
## hard -3.567e-01 1.542e-01 -2.313 0.020704 *
## fucked 1.792e+00 2.843e-01 6.303 2.91e-10 ***
## everything -4.881e-01 1.910e-01 -2.556 0.010600 *
## cuntfranks 1.489e+01 8.827e+02 0.017 0.986541
## cline -6.317e-01 3.582e-01 -1.763 0.077840 .
## shes 2.552e-01 2.375e-01 1.075 0.282494
## obviously -4.060e-01 1.949e-01 -2.083 0.037264 *
## balls 1.647e+00 2.278e-01 7.229 4.86e-13 ***
## quit -5.067e-01 1.466e-01 -3.457 0.000546 ***
## mom 7.102e-01 1.623e-01 4.377 1.20e-05 ***
## weak -7.693e-01 3.651e-01 -2.107 0.035105 *
## ps -3.518e-01 7.922e-02 -4.441 8.93e-06 ***
## chink 5.676e-01 5.878e-01 0.965 0.334300
## boy 5.933e-01 1.337e-01 4.437 9.12e-06 ***
## lmao 7.959e-01 4.800e-01 1.658 0.097281 .
## friends 4.292e-01 2.456e-01 1.748 0.080528 .
## dare 4.569e-01 2.221e-01 2.057 0.039654 *
## ahead -6.687e-01 2.278e-01 -2.935 0.003333 **
## spics 4.898e+00 1.620e+00 3.024 0.002497 **
## listen 1.441e-01 1.915e-01 0.753 0.451728
## fun -2.331e-01 1.641e-01 -1.420 0.155523
## cause -3.149e-01 7.028e-02 -4.481 7.45e-06 ***
## minorities -9.159e+00 1.744e+00 -5.252 1.50e-07 ***
## family -3.767e-01 2.369e-01 -1.590 0.111800
## dead -5.671e-02 2.004e-01 -0.283 0.777200
## nerd 2.201e+00 2.160e-01 10.186 < 2e-16 ***
## knob 1.479e+00 6.459e-01 2.290 0.022020 *
## jasenm222 7.511e+00 8.827e+02 0.009 0.993212
## due -8.700e-01 2.788e-01 -3.121 0.001802 **
## dickfucking NA NA NA NA
## youll -3.876e-02 1.905e-01 -0.203 0.838766
## wow 3.404e-02 1.999e-01 0.170 0.864765
## salt -1.110e+00 7.307e-01 -1.519 0.128741
## n -7.693e-01 6.335e-02 -12.144 < 2e-16 ***
## assholes -4.691e-01 3.438e-01 -1.364 0.172411
## pig 2.180e+00 1.820e-01 11.975 < 2e-16 ***
## fuckingabf 1.455e+01 8.827e+02 0.016 0.986849
## dear 6.707e-02 1.988e-01 0.337 0.735883
## bongwarriorcongratualtions 1.127e+01 8.827e+02 0.013 0.989813
## worthless 8.133e-01 2.993e-01 2.717 0.006583 **
## phuq 3.481e+00 1.644e+00 2.117 0.034256 *
## njgw 1.658e+00 1.261e+00 1.315 0.188522
## mothers -1.276e+00 5.858e-01 -2.178 0.029371 *
## liar 9.547e-01 1.495e-01 6.385 1.72e-10 ***
## douchebag -9.145e-01 3.941e-01 -2.320 0.020323 *
## complete -2.472e-01 2.196e-01 -1.126 0.260115
## joke 1.721e-01 1.899e-01 0.906 0.364866
## jforget 9.120e+00 8.827e+02 0.010 0.991757
## calling -5.585e-01 1.927e-01 -2.899 0.003747 **
## asian 4.216e-01 3.325e-01 1.268 0.204819
## mods 6.386e-01 6.563e-01 0.973 0.330537
## watch -6.020e-01 1.714e-01 -3.513 0.000444 ***
## wasnt -3.496e-01 1.909e-01 -1.831 0.067047 .
## told -4.452e-01 2.061e-01 -2.160 0.030771 *
## sucking 2.304e+00 3.677e-01 6.265 3.72e-10 ***
## kike 1.181e-01 6.629e-01 0.178 0.858635
## freak 1.511e+00 1.893e-01 7.985 1.41e-15 ***
## slap -9.340e-02 4.988e-01 -0.187 0.851461
## rape 1.785e-01 2.777e-01 0.643 0.520208
## likes 1.068e+00 2.161e-01 4.943 7.69e-07 ***
## stick -8.183e-02 2.124e-01 -0.385 0.700038
## peoples -4.948e-02 2.250e-01 -0.220 0.825985
## lolooolbootstoots 4.052e+01 1.158e+03 0.035 0.972084
## learn -7.335e-01 1.814e-01 -4.042 5.29e-05 ***
## billj 8.158e-01 2.526e+00 0.323 0.746716
## sannse 3.825e+00 2.858e+00 1.339 0.180709
## bet -2.784e-01 9.151e-02 -3.042 0.002352 **
## angela -5.016e+00 2.847e+00 -1.762 0.078074 .
## steal 8.507e-01 3.875e-01 2.195 0.028157 *
## motherfucking -6.090e-01 5.831e-01 -1.044 0.296310
## play -4.453e-01 1.454e-01 -3.063 0.002193 **
## credit -6.406e-01 3.832e-01 -1.672 0.094556 .
## wouldnt -9.307e-02 2.034e-01 -0.458 0.647221
## self -1.928e-01 9.371e-02 -2.058 0.039604 *
## money 2.136e-02 2.759e-01 0.077 0.938297
## lifetime 2.499e-01 7.880e-01 0.317 0.751118
## libtard -1.036e+01 6.034e+02 -0.017 0.986307
## fuckbags 8.457e+00 8.827e+02 0.010 0.992356
## friend -1.826e-01 1.684e-01 -1.084 0.278294
## country -5.965e-01 2.356e-01 -2.532 0.011343 *
## computer -1.238e-01 2.214e-01 -0.559 0.576214
## limpeddicked 1.249e+01 1.220e+03 0.010 0.991832
## gets -3.745e-01 2.340e-01 -1.600 0.109516
## coming -3.798e-01 2.001e-01 -1.898 0.057698 .
## act -8.197e-01 6.794e-02 -12.064 < 2e-16 ***
## wait -3.071e-01 1.933e-01 -1.589 0.112115
## troll -2.209e-02 1.691e-01 -0.131 0.896065
## nobody -3.296e-01 2.579e-01 -1.278 0.201238
## itbitch 1.200e+01 3.994e+02 0.030 0.976041
## dipshit 3.169e+00 4.318e-01 7.340 2.14e-13 ***
## posted -4.013e-01 2.185e-01 -1.837 0.066250 .
## dust -4.316e-01 3.908e-01 -1.104 0.269392
## completely -2.748e-01 3.043e-01 -0.903 0.366503
## sit -3.933e-01 7.938e-02 -4.955 7.24e-07 ***
## sex 3.795e-01 1.649e-01 2.301 0.021394 *
## home -8.498e-01 2.540e-01 -3.345 0.000822 ***
## business 3.253e-01 2.016e-01 1.614 0.106508
## brain 5.345e-01 2.039e-01 2.621 0.008764 **
## human -2.618e-01 1.963e-01 -1.334 0.182331
## mr -1.496e-01 1.761e-01 -0.849 0.395656
## homosexual 2.390e-01 3.518e-01 0.680 0.496815
## hole 3.955e-01 1.181e-01 3.350 0.000807 ***
## wanna 1.050e+00 2.013e-01 5.214 1.85e-07 ***
## small -8.041e-02 2.123e-01 -0.379 0.704913
## rest -9.218e-01 1.239e-01 -7.440 1.01e-13 ***
## nate -8.302e-01 1.804e-01 -4.602 4.19e-06 ***
## filter -7.450e-01 8.078e-01 -0.922 0.356447
## couriano -9.897e+00 6.076e+02 -0.016 0.987005
## cool -2.732e-01 2.347e-01 -1.164 0.244250
## child 2.252e-01 1.585e-01 1.420 0.155513
## blank -1.301e+00 3.729e-01 -3.489 0.000484 ***
## aint -1.603e-01 1.735e-01 -0.924 0.355510
## yours 7.370e-01 1.073e-01 6.870 6.41e-12 ***
## comes -9.051e-02 2.201e-01 -0.411 0.680890
## wanted -6.081e-01 2.053e-01 -2.961 0.003062 **
## telling 1.494e-01 2.180e-01 0.685 0.493036
## semen -8.747e-02 2.772e-01 -0.316 0.752321
## jesus -3.343e-02 2.699e-01 -0.124 0.901396
## faggotjéské 2.163e+01 1.072e+03 0.020 0.983898
## chuck 1.897e-01 6.582e-01 0.288 0.773231
## acting 1.065e+00 2.160e-01 4.928 8.32e-07 ***
## rvv 2.694e+00 9.565e-01 2.816 0.004856 **
## kids 4.877e-01 3.360e-01 1.452 0.146585
## heard -6.188e-01 2.431e-01 -2.545 0.010922 *
## fucks 2.165e+00 3.590e-01 6.032 1.62e-09 ***
## enjoy -3.498e-01 1.998e-01 -1.750 0.080044 .
## deserve -1.942e-01 2.164e-01 -0.898 0.369426
## burn 5.541e-01 2.190e-01 2.531 0.011387 *
## band 1.744e-01 2.174e-01 0.802 0.422522
## total -1.647e-01 1.754e-01 -0.939 0.347548
## slut 3.459e+00 4.514e-01 7.662 1.83e-14 ***
## password -2.209e+00 1.388e+00 -1.591 0.111571
## nl33ers 4.505e+00 1.419e+00 3.175 0.001497 **
## lies -6.311e-02 1.680e-01 -0.376 0.707252
## biggest 1.370e-01 3.147e-01 0.435 0.663229
## administrator -1.599e-01 1.736e-01 -0.921 0.357044
## vandalize -8.410e-01 1.869e-01 -4.501 6.77e-06 ***
## metal -6.490e-01 3.764e-01 -1.724 0.084684 .
## women -1.974e-01 2.866e-01 -0.689 0.490848
## waste 2.302e-01 2.187e-01 1.052 0.292599
## vandalizing 2.907e-01 2.492e-01 1.167 0.243292
## poor 4.142e-01 2.074e-01 1.997 0.045829 *
## outside -2.438e-01 3.129e-01 -0.779 0.435896
## lost 8.138e-02 2.226e-01 0.366 0.714721
## grow 3.252e-01 2.024e-01 1.607 0.108125
## girl 1.599e-01 1.861e-01 0.859 0.390234
## funny -5.003e-01 2.939e-01 -1.702 0.088682 .
## false -1.161e-01 2.035e-01 -0.571 0.568275
## soon -9.322e-01 2.283e-01 -4.083 4.45e-05 ***
## sir -3.353e-02 2.053e-01 -0.163 0.870281
## morons -1.884e-01 3.300e-01 -0.571 0.567981
## kid 1.575e-01 1.972e-01 0.799 0.424443
## allowed -1.591e-01 2.311e-01 -0.688 0.491251
## okay -3.203e-01 2.338e-01 -1.370 0.170743
## lying 1.499e-01 1.811e-01 0.828 0.407878
## looks -6.467e-01 2.103e-01 -3.075 0.002103 **
## high -7.481e-01 1.674e-01 -4.468 7.90e-06 ***
## disgusting 1.439e+00 2.705e-01 5.322 1.03e-07 ***
## wonder -3.219e-01 1.803e-01 -1.786 0.074151 .
## unblock -6.014e-01 2.022e-01 -2.974 0.002943 **
## shoot -6.442e-01 3.698e-01 -1.742 0.081539 .
## bully 1.124e+00 2.418e-01 4.650 3.32e-06 ***
## wtf 6.252e-01 2.682e-01 2.331 0.019755 *
## usernhrhs2010 2.248e-01 1.596e+00 0.141 0.887997
## single -7.472e-01 2.489e-01 -3.002 0.002684 **
## raped 1.305e+00 4.500e-01 2.900 0.003735 **
## o 3.055e-02 1.007e-01 0.303 0.761561
## night -1.820e-01 2.006e-01 -0.907 0.364171
## hours -3.854e-01 2.459e-01 -1.568 0.116968
## hand -1.450e-01 1.519e-01 -0.954 0.339842
## cut -3.173e-01 2.006e-01 -1.582 0.113665
## worse 3.484e-02 2.868e-01 0.121 0.903314
## spend 6.775e-01 2.154e-01 3.146 0.001656 **
## shouldnt -3.353e-01 2.344e-01 -1.430 0.152583
## screw 8.228e-01 2.423e-01 3.395 0.000686 ***
## posts -2.205e-01 2.748e-01 -0.802 0.422343
## mccain 1.654e-01 1.048e+00 0.158 0.874628
## hitler 9.883e-01 2.383e-01 4.147 3.37e-05 ***
## gave 3.805e-02 2.150e-01 0.177 0.859489
## fine -8.304e-01 2.025e-01 -4.100 4.13e-05 ***
## fight -2.939e-01 1.981e-01 -1.484 0.137925
## together 1.656e-02 2.319e-01 0.071 0.943061
## thinks -4.885e-01 2.771e-01 -1.763 0.077949 .
## sloppy 9.282e-02 9.352e-01 0.099 0.920936
## run -3.599e-01 1.582e-01 -2.275 0.022879 *
## punk 8.563e-01 3.088e-01 2.773 0.005549 **
## open -2.742e-01 1.950e-01 -1.406 0.159754
## haha 1.120e+00 1.631e-01 6.867 6.56e-12 ***
## filthy 1.759e+00 3.779e-01 4.654 3.25e-06 ***
## evil 1.855e-01 2.251e-01 0.824 0.409889
## butt 3.362e-01 1.886e-01 1.782 0.074687 .
## userenigmaman 6.931e-01 1.871e+00 0.371 0.711008
## saliva -8.154e-01 2.154e+00 -0.379 0.704968
## report -6.831e-01 1.661e-01 -4.113 3.91e-05 ***
## propaganda 1.732e-01 2.451e-01 0.707 0.479646
## nonsense -4.240e-01 2.125e-01 -1.996 0.045938 *
## lets -8.963e-01 2.304e-01 -3.889 0.000100 ***
## lazy 2.379e-01 3.270e-01 0.728 0.466904
## jackass 2.471e+00 2.858e-01 8.648 < 2e-16 ***
## gives 2.524e-02 2.673e-01 0.094 0.924790
## constructed -2.764e+00 4.089e+00 -0.676 0.499088
## cares 4.294e-01 2.998e-01 1.432 0.152058
## yourselves 3.936e-01 3.356e-01 1.173 0.240898
## wants -3.136e-01 2.658e-01 -1.180 0.238062
## tried -6.459e-01 2.486e-01 -2.598 0.009374 **
## shows -5.399e-01 2.514e-01 -2.148 0.031721 *
## pretty -8.117e-01 2.389e-01 -3.397 0.000680 ***
## penisi 2.003e+00 1.581e+00 1.267 0.205178
## norriss 4.854e+00 4.151e+00 1.169 0.242322
## goddamn 6.562e-01 4.484e-01 1.463 0.143348
## gg 1.400e-01 7.746e-02 1.807 0.070758 .
## deal -1.197e+00 2.234e-01 -5.359 8.35e-08 ***
## d31r 1.689e+01 8.827e+02 0.019 0.984733
## bye 4.287e-01 2.273e-01 1.886 0.059329 .
## bother 6.087e-01 2.278e-01 2.672 0.007534 **
## writing -6.237e-01 2.149e-01 -2.902 0.003712 **
## shove 6.829e-01 3.544e-01 1.927 0.054019 .
## serious -5.112e-01 2.505e-01 -2.040 0.041305 *
## send 4.145e-01 2.081e-01 1.992 0.046377 *
## remember -4.708e-01 2.233e-01 -2.108 0.034993 *
## goes -9.413e-01 2.752e-01 -3.421 0.000624 ***
## edited -4.491e-01 2.239e-01 -2.006 0.044904 *
## cuz 5.881e-02 3.723e-01 0.158 0.874499
## bastards -5.269e-01 4.167e-01 -1.265 0.206021
## arrogant 9.435e-01 2.693e-01 3.504 0.000459 ***
## anymore -1.129e+00 3.217e-01 -3.511 0.000447 ***
## `4` -2.683e-01 6.073e-02 -4.418 9.97e-06 ***
## losers 6.479e-01 3.341e-01 1.939 0.052494 .
## lives 1.862e-01 3.145e-01 0.592 0.553781
## fascists 2.410e+00 3.931e-01 6.131 8.71e-10 ***
## everyday 2.188e-01 5.179e-01 0.422 0.672685
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## (Dispersion parameter for binomial family taken to be 1)
##
## Null deviance: 62755 on 159570 degrees of freedom
## Residual deviance: 31491 on 159134 degrees of freedom
## AIC: 32365
##
## Number of Fisher Scoring iterations: 13
confusion_data(ins_reg)
## Maximum accuracy is acheived at a cutoff of: 0.38

##
## Confusion Matrix and Statistics
##
## Reference
## Prediction 0 1
## 0 150223 3513
## 1 1471 4364
##
## Accuracy : 0.9688
## 95% CI : (0.9679, 0.9696)
## No Information Rate : 0.9506
## P-Value [Acc > NIR] : < 2.2e-16
##
## Kappa : 0.6206
## Mcnemar's Test P-Value : < 2.2e-16
##
## Sensitivity : 0.9903
## Specificity : 0.5540
## Pos Pred Value : 0.9771
## Neg Pred Value : 0.7479
## Prevalence : 0.9506
## Detection Rate : 0.9414
## Detection Prevalence : 0.9634
## Balanced Accuracy : 0.7722
## F-val Accuracy : 0.9837
##
## 'Positive' Class : 0
summary(idn_reg)
##
## Call:
## glm(formula = identity_hate ~ ., family = binomial(link = "logit"),
## data = idn_tmp)
##
## Deviance Residuals:
## Min 1Q Median 3Q Max
## -4.7676 -0.1127 -0.0759 -0.0501 3.9036
##
## Coefficients: (1 not defined because of singularities)
## Estimate Std. Error z value Pr(>|z|)
## (Intercept) -4.81370 0.11454 -42.026 < 2e-16 ***
## fat 0.78226 0.19082 4.100 4.14e-05 ***
## jew 3.29617 0.19184 17.182 < 2e-16 ***
## faggot 1.40938 0.21002 6.711 1.94e-11 ***
## huge 0.66293 0.34289 1.933 0.053191 .
## stupid 0.93141 0.15998 5.822 5.81e-09 ***
## cunt 0.98179 0.18575 5.286 1.25e-07 ***
## mexicans 3.09629 0.56503 5.480 4.26e-08 ***
## bitch 1.19285 0.15264 7.815 5.50e-15 ***
## niggas -0.01498 0.72896 -0.021 0.983610
## bunksteve 21.37977 2399.54472 0.009 0.992891
## tommy2010 4.02241 1.19651 3.362 0.000774 ***
## ancestryfuckoffjewish 19.94400 2399.54473 0.008 0.993368
## kill 0.39343 0.19642 2.003 0.045180 *
## jews -0.91487 0.25104 -3.644 0.000268 ***
## spanish -0.55450 0.77721 -0.713 0.475571
## licker 1.06732 0.68621 1.555 0.119853
## centraliststupid 21.24562 2399.54485 0.009 0.992936
## fan1967 3.69495 1.33769 2.762 0.005742 **
## piece 0.80742 0.19545 4.131 3.61e-05 ***
## nigga 5.25610 0.27998 18.773 < 2e-16 ***
## drink 1.41473 0.44437 3.184 0.001454 **
## bleachanhero 15.92234 2399.54479 0.007 0.994706
## eat -0.54597 0.12892 -4.235 2.29e-05 ***
## dick 0.87343 0.19724 4.428 9.50e-06 ***
## homo 3.13676 0.20196 15.531 < 2e-16 ***
## niggers 5.21391 0.35769 14.576 < 2e-16 ***
## nl33ers 21.62253 1696.73434 0.013 0.989832
## cody 2.88626 1.11170 2.596 0.009425 **
## edie 0.07369 0.85798 0.086 0.931551
## di -0.97403 0.07547 -12.906 < 2e-16 ***
## romney -9.97150 379.42611 -0.026 0.979034
## mitt -1.40142 0.56028 -2.501 0.012374 *
## racist 1.57448 0.19039 8.270 < 2e-16 ***
## cline -0.40547 0.68069 -0.596 0.551386
## minorities -0.41011 0.85554 -0.479 0.631682
## spics 1.69351 4.75589 0.356 0.721775
## chink 2.35418 0.55256 4.261 2.04e-05 ***
## white 0.28139 0.22412 1.256 0.209282
## sucks 1.10564 0.33083 3.342 0.000832 ***
## cocksucking 0.14144 0.56390 0.251 0.801947
## jforget 13.76957 2399.54485 0.006 0.995421
## shitty -0.96334 0.81908 -1.176 0.239547
## scum 1.68707 0.26299 6.415 1.41e-10 ***
## asian 0.94571 0.34727 2.723 0.006464 **
## nazi 2.12461 0.15881 13.378 < 2e-16 ***
## homosexual -0.34799 0.32648 -1.066 0.286479
## john -0.76859 0.48296 -1.591 0.111515
## ur -0.27878 0.07277 -3.831 0.000128 ***
## fag 2.21509 0.18179 12.185 < 2e-16 ***
## couriano -10.99974 1690.91855 -0.007 0.994810
## cock 0.46512 0.21080 2.206 0.027352 *
## hell -0.02655 0.16661 -0.159 0.873391
## faggotjéské 28.34516 2935.47618 0.010 0.992296
## black 1.36324 0.21659 6.294 3.09e-10 ***
## pussy 0.01155 0.38084 0.030 0.975807
## fuckin 1.42202 0.10975 12.956 < 2e-16 ***
## bush 1.01898 0.44220 2.304 0.021202 *
## usernhrhs2010 12.59947 379.42826 0.033 0.973510
## twat 1.89398 0.34170 5.543 2.98e-08 ***
## mccain -12.38678 312.72049 -0.040 0.968404
## userenigmaman 0.69315 1.87083 0.371 0.711008
## whore 0.76088 0.35368 2.151 0.031452 *
## d31r 22.58587 2399.54486 0.009 0.992490
## fucker 1.51795 0.27458 5.528 3.23e-08 ***
## jewish -1.61764 0.28512 -5.674 1.40e-08 ***
## bunch 0.69463 0.29412 2.362 0.018191 *
## retarded 1.25573 0.31783 3.951 7.78e-05 ***
## rape 1.17773 0.24895 4.731 2.24e-06 ***
## muslim 2.48423 0.24265 10.238 < 2e-16 ***
## guy 0.30534 0.24102 1.267 0.205205
## asshole -0.07804 0.22999 -0.339 0.734372
## penis 1.53182 0.27008 5.672 1.41e-08 ***
## mother -0.09284 0.22974 -0.404 0.686154
## hes -0.65794 0.15532 -4.236 2.28e-05 ***
## dumb 0.79475 0.22892 3.472 0.000517 ***
## dirty 1.95524 0.27891 7.010 2.38e-12 ***
## job 0.16129 0.27891 0.578 0.563071
## fucked 1.23798 0.32536 3.805 0.000142 ***
## face 0.10472 0.22960 0.456 0.648309
## homosexuals -0.00524 0.45483 -0.012 0.990807
## slut 1.39253 0.49958 2.787 0.005314 **
## bastard 1.67838 0.21261 7.894 2.92e-15 ***
## wait -0.02423 0.33307 -0.073 0.942011
## money 0.25747 0.39160 0.657 0.510876
## guys -0.11822 0.36485 -0.324 0.745928
## cool 0.59127 0.31514 1.876 0.060622 .
## nl33ersi NA NA NA NA
## everyone -0.23990 0.27855 -0.861 0.389109
## shut 0.34025 0.27457 1.239 0.215260
## muslims -0.88640 0.37910 -2.338 0.019379 *
## live 0.09043 0.20392 0.443 0.657428
## islam 0.65808 0.29217 2.252 0.024297 *
## diego 2.06354 1.08109 1.909 0.056292 .
## computeri -9.97628 1596.23318 -0.006 0.995013
## california -0.80843 0.82585 -0.979 0.327627
## ya -0.50739 0.19821 -2.560 0.010473 *
## vista -10.69796 324.10645 -0.033 0.973669
## ugly 0.65563 0.35735 1.835 0.066548 .
## son -1.26925 0.14424 -8.800 < 2e-16 ***
## shitheadi 41.63001 2242.94265 0.019 0.985192
## quit -0.73773 0.29561 -2.496 0.012573 *
## mom 0.61444 0.23794 2.582 0.009812 **
## mesan -11.28016 776.67276 -0.015 0.988412
## gonna 0.71359 0.28733 2.484 0.013008 *
## douchebag -0.22780 0.70668 -0.322 0.747183
## damn 0.51166 0.26885 1.903 0.057017 .
## chula -10.23923 1332.12670 -0.008 0.993867
## arrest -0.33673 1.03109 -0.327 0.743990
## r -0.24276 0.11922 -2.036 0.041725 *
## indian 1.47425 0.30392 4.851 1.23e-06 ***
## idiot 0.97389 0.22516 4.325 1.52e-05 ***
## dipshit 1.09333 0.77883 1.404 0.160376
## arent -0.86469 0.29612 -2.920 0.003499 **
## worse 0.56472 0.46074 1.226 0.220317
## women 0.05302 0.31905 0.166 0.868007
## shes 0.38663 0.44949 0.860 0.389704
## pathetic 0.84453 0.28987 2.913 0.003574 **
## internet -0.50915 0.37366 -1.363 0.173003
## death -0.09751 0.33433 -0.292 0.770546
## country 0.73789 0.24280 3.039 0.002373 **
## boy 0.89091 0.20169 4.417 9.99e-06 ***
## ban -0.10371 0.16431 -0.631 0.527939
## yo 0.46032 0.07048 6.531 6.52e-11 ***
## loser 0.12450 0.30365 0.410 0.681797
## god -0.43172 0.25689 -1.681 0.092857 .
## friends -0.01431 0.30678 -0.047 0.962798
## dickface -14.67163 815.25043 -0.018 0.985642
## chinese 0.73264 0.38736 1.891 0.058574 .
## asswhole 26.77043 2534.26516 0.011 0.991572
## yeah -0.05817 0.28071 -0.207 0.835838
## wigger 2.14642 6.90408 0.311 0.755883
## viva -10.97754 184.11297 -0.060 0.952455
## sex 1.00412 0.21716 4.624 3.77e-06 ***
## sad 0.06131 0.26547 0.231 0.817350
## motherfucker -0.70539 0.43654 -1.616 0.106117
## la -0.65094 0.08462 -7.692 1.45e-14 ***
## jesus 0.55261 0.33744 1.638 0.101488
## fuckk 2.67108 1.30214 2.051 0.040238 *
## ruin -0.72156 0.56842 -1.269 0.204298
## republicango 44.47332 2426.83065 0.018 0.985379
## likes 1.26973 0.29949 4.240 2.24e-05 ***
## israel 0.12632 0.30963 0.408 0.683289
## game -1.43430 0.53646 -2.674 0.007503 **
## fool 1.05835 0.28849 3.669 0.000244 ***
## everything -0.55543 0.32362 -1.716 0.086106 .
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## (Dispersion parameter for binomial family taken to be 1)
##
## Null deviance: 16096 on 159570 degrees of freedom
## Residual deviance: 10613 on 159426 degrees of freedom
## AIC: 10903
##
## Number of Fisher Scoring iterations: 15
confusion_data(idn_reg)
## Maximum accuracy is acheived at a cutoff of: 0.84

##
## Confusion Matrix and Statistics
##
## Reference
## Prediction 0 1
## 0 158122 1312
## 1 44 93
##
## Accuracy : 0.9915
## 95% CI : (0.9910, 0.9919)
## No Information Rate : 0.9912
## P-Value [Acc > NIR] : 0.09633
##
## Kappa : 0.1192
## Mcnemar's Test P-Value : < 2.2e-16
##
## Sensitivity : 0.9997
## Specificity : 0.0662
## Pos Pred Value : 0.9918
## Neg Pred Value : 0.6788
## Prevalence : 0.9912
## Detection Rate : 0.9909
## Detection Prevalence : 0.9991
## Balanced Accuracy : 0.5330
## F-val Accuracy : 0.9957
##
## 'Positive' Class : 0
Preprocess
dat <- fread("~/toxic_comments/input/test.csv", header = T, stringsAsFactors = F)
dat$cln_txt <- clean_text(dat$comment_text)
tox_tmp <- strict_regex(tox_bow, dat$cln_txt)
stx_tmp <- strict_regex(stx_bow, dat$cln_txt)
obs_tmp <- strict_regex(obs_bow, dat$cln_txt)
thr_tmp <- strict_regex(thr_bow, dat$cln_txt)
ins_tmp <- strict_regex(ins_bow, dat$cln_txt)
idn_tmp <- strict_regex(idn_bow, dat$cln_txt)
#Convert list to data.frame
tox_tmp <- to_df(tox_tmp, tox_bow)
stx_tmp <- to_df(stx_tmp, stx_bow)
obs_tmp <- to_df(obs_tmp, obs_bow)
thr_tmp <- to_df(thr_tmp, thr_bow)
ins_tmp <- to_df(ins_tmp, ins_bow)
idn_tmp <- to_df(idn_tmp, idn_bow)
#Generate probability values
toxic <- predict(tox_reg, tox_tmp, type="response")
## Warning in predict.lm(object, newdata, se.fit, scale = 1, type =
## ifelse(type == : prediction from a rank-deficient fit may be misleading
severe_toxic <- predict(stx_reg, stx_tmp, type="response")
obscene <- predict(obs_reg, obs_tmp, type="response")
## Warning in predict.lm(object, newdata, se.fit, scale = 1, type =
## ifelse(type == : prediction from a rank-deficient fit may be misleading
threat <- predict(thr_reg, thr_tmp, type="response")
insult <- predict(ins_reg, ins_tmp, type="response")
## Warning in predict.lm(object, newdata, se.fit, scale = 1, type =
## ifelse(type == : prediction from a rank-deficient fit may be misleading
identity_hate <- predict(idn_reg, idn_tmp, type="response")
## Warning in predict.lm(object, newdata, se.fit, scale = 1, type =
## ifelse(type == : prediction from a rank-deficient fit may be misleading
id <- dat$id
out <- data.frame(id, toxic, severe_toxic, obscene, threat, insult, identity_hate)
write.csv(out, file = "/Users/kai-ou/desktop/toxic_comment_submission_24Feb18.csv", row.names = F)