final_project_clustering.Rmd.
I hope to use clustering to determine the combination of features that contribute to PositiveChange. However, because clustering deals primarily with interval variables (because of distances that need to be calculated), it is impossible to calculate distances based upon nominal variables with arbitrary values. For this reason, I have separated out the interval variables from my dataset, and one-hot encoded the nominal variables in the dataset, and combined them.
With this dataset, I trained and predicted the k using the kNN model starting at the default k-value(Full Dataset:
k_full_onehot
## [1] 31
and Objective Dataset:
k_objective_onehot
## [1] 31
). Using the optimal k number of clusters to use, I used this new k value to determine the exact features that had determined the PositiveChange. Using the k-means model and the optimal k-value, the cluster centers became the basis of my analysis. Calculating the standard deviation of the cluster centers, I was able to categorize these features into the following separate buckets: strong inverse associations, inverse associations, associations, and strong associations.
# kNN libraries
library(class)
library(gmodels)
library(e1071)
# k-means libraries
library(cluster)
library(matrixStats)
# k-means functions
# run the k++ function instead
<- function(dat, K) {
kpp_init = as.matrix(dat)
x = nrow(x)
n # Randomly choose a first center
= matrix(NA, nrow=K, ncol=ncol(x))
centers set.seed(1234)
1,] = as.matrix(x[sample(1:n, 1),])
centers[for (k in 2:K) {
# Calculate dist^2 to closest center for each point
= matrix(NA, nrow=n, ncol=k-1)
dists for (j in 1:(k-1)) {
= sweep(x, 2, centers[j,], '-')
temp = rowSums(temp^2)
dists[,j]
}= rowMins(dists)
dists # Draw next center with probability proportional to dist^2
= cumsum(dists)
cumdists = runif(1, min=0, max=cumdists[n])
prop = as.matrix(x[min(which(cumdists > prop)),])
centers[k,]
}return(centers)
}
# return a list of the plot, clusters, and whether the k++ function was used
<- function(df, K, bKPP = T) {
plot_silhouette set.seed(1234)
print(K)
if(bKPP)
<- kmeans(df, kpp_init(df, K), iter.max=10, algorithm='Lloyd')
clusters else
<- kmeans(df, K)
clusters <- dist(df)
dis <- silhouette(clusters$cluster, dis)
sil summary(sil)
<- factoextra::fviz_silhouette(sil, label=T, palette = "jco", ggtheme = theme_classic())
fviz <- str_split(fviz$labels$title, pattern = " ")[[1]][8]
result <- list(fviz, clusters, result)
returned return(returned)
}
# plot the kmeans tuning graph to visualize the elbow
<- function(df, K, bKPP = T) {
plot_tuning = matrix(0, nrow = K)
mat for(i in 2:K) {
set.seed(1234)
if(bKPP)
= kmeans(df, kpp_init(df, i), iter.max=10, algorithm='Lloyd')
clust_kpp else
= kmeans(df, i)
clust_kpp <- dist(df)
dis = silhouette(clust_kpp$cluster, dis)
sil = mean(as.matrix(sil)[,3])
mat[i]
}colnames(mat) <- c("Avg_Silhouette_Value")
<- data.frame(k = 2:K, sil = mat[2:K])
df plot_ly(df, x = ~k, y = ~sil, type = 'scatter', mode = 'lines', name='Silhouette') %>%
layout(title="Average Silhouette Graph")
}
# UNUSED - explicate all of the clusters in the silhouette - may need fine tuning clusters aren't very easy and plot not very useful
<- function(clusters) {
explicate_clusters <- as.data.frame(t(clusters$centers))
df <- rownames(df)
rowNames <- length(clusters$size)
cluster_num colnames(df) <- paste0("Cluster",c(1:cluster_num))
<- plot_ly()
p for(i in 1:ncol(df)) {
<- p %>% add_trace(data = df, x = rownames(df), y = ~df[ , i], type = "bar", name = paste0("Cluster", i))
p
}<- p %>% layout(title="Explicating Derived Cluster Labels", yaxis = list(title = 'Cluster Centers'), barmode = 'group')
p
p
}
# clean up the center colnames to include the translations to unobfuscate the onehot encoding. so the output is more meaningful
<- function(matrix_centers) {
matrix_centers_cleaned_up <- matrix_centers
new_centers for(c in 1:ncol(matrix_centers)) {
<- colnames(matrix_centers)[c]
name <- unlist(str_split(name, "\\.", n = 2))
vect_name <- fieldname_to_description(vect_name[1])
description # if there is an obscure fieldname value, pass in the value and the obscure description to get the value description otherwise, there is no one-hot encoding of the description.
if(length(vect_name) > 1)
<- value_fieldname_to_description(vect_name[2], vect_name[1])
value_description else
<- ""
value_description ## Do not include values that are NA or ""
if(!is.na(value_description) && trimws(value_description) != "")
if(value_description == ".")
colnames(new_centers)[c] <- paste0("[", description, " - NA]")
else
colnames(new_centers)[c] <- paste0("[", description, " - ", value_description, "]")
else
colnames(new_centers)[c] <- paste0("[", description, "]")
}return(new_centers)
}
# print a matrix of the centers sorted by their associations
<- function(matrix_centers) {
print_centers_summary <- sd(matrix_centers)
s <- nrow(matrix_centers)
num_clusters <- vector(mode="character", length = num_clusters)
vect_clusters <- vector(mode="character", length = num_clusters)
vect_strong_inverse_association <- vector(mode="character", length = num_clusters)
vect_inverse_association <- vector(mode="character", length = num_clusters)
vect_association <- vector(mode="character", length = num_clusters)
vect_strong_association
for(i in 1:ncol(matrix_centers)) {
for(j in 1:num_clusters) {
<- paste0("Cluster ", j)
vect_clusters[j] if(matrix_centers[j,i] <= -2 * s)
if(vect_strong_inverse_association[j] == "")
= colnames(matrix_centers)[i]
vect_strong_inverse_association[j] else
<- paste0(vect_strong_inverse_association[j], " + ", colnames(matrix_centers)[i])
vect_strong_inverse_association[j] else if(matrix_centers[j,i] > -2 * s && matrix_centers[j,i] <= -s)
if(vect_inverse_association[j] == "")
= colnames(matrix_centers)[i]
vect_inverse_association[j] else
<- paste0(vect_inverse_association[j], " + ", colnames(matrix_centers)[i])
vect_inverse_association[j] else if(matrix_centers[j,i] >= s && matrix_centers[j,i] < 2 *s)
if(vect_association[j] == "")
= colnames(matrix_centers)[i]
vect_association[j] else
<- paste0(vect_association[j], " + ", colnames(matrix_centers)[i])
vect_association[j] else if (matrix_centers[j,i] >= 2 * s)
if(vect_strong_association[j] == "")
= colnames(matrix_centers)[i]
vect_strong_association[j] else
<- paste0(vect_strong_association)
vect_strong_association[j]
}
}<- data.frame(Cluster = vect_clusters, StrongInverseAssociation = vect_strong_inverse_association, InverseAssociation = vect_inverse_association, Association = vect_association, StrongAssociation = vect_strong_association)
df_printout %>%
df_printout kbl(escape = F, valign="top") %>%
kable_styling()
}
<- function(ct, K) {
print_sensitivity_specificity <- ct$prop.row[1, 1]
ct_TN <- ct$prop.row[1, 2]
ct_FP <- ct$prop.row[2, 1]
ct_FN <- ct$prop.row[2, 2]
ct_TP <- ct_TN/(ct_TN+ct_FP)
ct_sensi <- ct_TP/(ct_TP+ct_FN)
ct_speci print(paste0("kNN model k=", K, " Sensitivity=", ct_sensi))
print(paste0("kNN model k=", K, " Specificity=", ct_speci))
}
#prepare the dataframes
<- df_full_train_onehot[ , "PositiveChange.Positive.Change"]
labels_train_full <- df_full_test_onehot[ , "PositiveChange.Positive.Change"]
labels_test_full <- df_full_train_onehot[ , !names(df_full_train_onehot) %in% "PositiveChange.Positive.Change"]
df_full_train_onehot_new <- df_full_test_onehot[ , !names(df_full_test_onehot) %in% "PositiveChange.Positive.Change"]
df_full_test_onehot_new
# run the knn with the default k
<- k_full_onehot
new_k_full <- knn(train = df_full_train_onehot_new, test = df_full_test_onehot_new, cl = labels_train_full, k = new_k_full)
pred_full <- CrossTable(x = labels_test_full, y = pred_full, prop.chisq = F) ct_full
##
##
## Cell Contents
## |-------------------------|
## | N |
## | N / Row Total |
## | N / Col Total |
## | N / Table Total |
## |-------------------------|
##
##
## Total Observations in Table: 394
##
##
## | pred_full
## labels_test_full | 0 | 1 | Row Total |
## -----------------|-----------|-----------|-----------|
## 0 | 115 | 79 | 194 |
## | 0.593 | 0.407 | 0.492 |
## | 0.920 | 0.294 | |
## | 0.292 | 0.201 | |
## -----------------|-----------|-----------|-----------|
## 1 | 10 | 190 | 200 |
## | 0.050 | 0.950 | 0.508 |
## | 0.080 | 0.706 | |
## | 0.025 | 0.482 | |
## -----------------|-----------|-----------|-----------|
## Column Total | 125 | 269 | 394 |
## | 0.317 | 0.683 | |
## -----------------|-----------|-----------|-----------|
##
##
print_sensitivity_specificity(ct_full, new_k_full)
## [1] "kNN model k=31 Sensitivity=0.592783505154639"
## [1] "kNN model k=31 Specificity=0.95"
confusionMatrix(table(pred_full, labels_test_full))
## Confusion Matrix and Statistics
##
## labels_test_full
## pred_full 0 1
## 0 115 10
## 1 79 190
##
## Accuracy : 0.7741
## 95% CI : (0.7296, 0.8145)
## No Information Rate : 0.5076
## P-Value [Acc > NIR] : < 2.2e-16
##
## Kappa : 0.5457
##
## Mcnemar's Test P-Value : 5.679e-13
##
## Sensitivity : 0.5928
## Specificity : 0.9500
## Pos Pred Value : 0.9200
## Neg Pred Value : 0.7063
## Prevalence : 0.4924
## Detection Rate : 0.2919
## Detection Prevalence : 0.3173
## Balanced Accuracy : 0.7714
##
## 'Positive' Class : 0
##
# optimal k
= tune.knn(x = df_full_train_onehot_new, y = as.factor(labels_train_full), k = 1:k_full_onehot)
tuning_full tuning_full
##
## Parameter tuning of 'knn.wrapper':
##
## - sampling method: 10-fold cross validation
##
## - best parameters:
## k
## 9
##
## - best performance: 0.177453
<- tuning_full$best.model$k
new_k_full <- knn(train = df_full_train_onehot_new, test = df_full_test_onehot_new, cl = labels_train_full, k = new_k_full)
pred_full <- CrossTable(x = labels_test_full, y = pred_full, prop.chisq = F) ct_full
##
##
## Cell Contents
## |-------------------------|
## | N |
## | N / Row Total |
## | N / Col Total |
## | N / Table Total |
## |-------------------------|
##
##
## Total Observations in Table: 394
##
##
## | pred_full
## labels_test_full | 0 | 1 | Row Total |
## -----------------|-----------|-----------|-----------|
## 0 | 123 | 71 | 194 |
## | 0.634 | 0.366 | 0.492 |
## | 0.891 | 0.277 | |
## | 0.312 | 0.180 | |
## -----------------|-----------|-----------|-----------|
## 1 | 15 | 185 | 200 |
## | 0.075 | 0.925 | 0.508 |
## | 0.109 | 0.723 | |
## | 0.038 | 0.470 | |
## -----------------|-----------|-----------|-----------|
## Column Total | 138 | 256 | 394 |
## | 0.350 | 0.650 | |
## -----------------|-----------|-----------|-----------|
##
##
print_sensitivity_specificity(ct_full, new_k_full)
## [1] "kNN model k=9 Sensitivity=0.634020618556701"
## [1] "kNN model k=9 Specificity=0.925"
confusionMatrix(table(pred_full, labels_test_full))
## Confusion Matrix and Statistics
##
## labels_test_full
## pred_full 0 1
## 0 123 15
## 1 71 185
##
## Accuracy : 0.7817
## 95% CI : (0.7376, 0.8215)
## No Information Rate : 0.5076
## P-Value [Acc > NIR] : < 2.2e-16
##
## Kappa : 0.5615
##
## Mcnemar's Test P-Value : 3.015e-09
##
## Sensitivity : 0.6340
## Specificity : 0.9250
## Pos Pred Value : 0.8913
## Neg Pred Value : 0.7227
## Prevalence : 0.4924
## Detection Rate : 0.3122
## Detection Prevalence : 0.3503
## Balanced Accuracy : 0.7795
##
## 'Positive' Class : 0
##
#prepare the dataframes
<- df_objective_train_onehot[ , "PositiveChange.Positive.Change"]
labels_train_objective <- df_objective_test_onehot[ , "PositiveChange.Positive.Change"]
labels_test_objective <- df_objective_train_onehot[ , !names(df_objective_train_onehot) %in% "PositiveChange.Positive.Change"]
df_objective_train_onehot_new <- df_objective_test_onehot[ , !names(df_objective_test_onehot) %in% "PositiveChange.Positive.Change"]
df_objective_test_onehot_new
# run the knn with the default k
<- k_objective_onehot
new_k_objective <- knn(train = df_objective_train_onehot_new, test = df_objective_test_onehot_new, cl = labels_train_objective, k = new_k_objective)
pred_objective <- CrossTable(x = labels_test_objective, y = pred_objective, prop.chisq = F) ct_objective
##
##
## Cell Contents
## |-------------------------|
## | N |
## | N / Row Total |
## | N / Col Total |
## | N / Table Total |
## |-------------------------|
##
##
## Total Observations in Table: 394
##
##
## | pred_objective
## labels_test_objective | 0 | 1 | Row Total |
## ----------------------|-----------|-----------|-----------|
## 0 | 94 | 100 | 194 |
## | 0.485 | 0.515 | 0.492 |
## | 0.940 | 0.340 | |
## | 0.239 | 0.254 | |
## ----------------------|-----------|-----------|-----------|
## 1 | 6 | 194 | 200 |
## | 0.030 | 0.970 | 0.508 |
## | 0.060 | 0.660 | |
## | 0.015 | 0.492 | |
## ----------------------|-----------|-----------|-----------|
## Column Total | 100 | 294 | 394 |
## | 0.254 | 0.746 | |
## ----------------------|-----------|-----------|-----------|
##
##
print_sensitivity_specificity(ct_objective, new_k_objective)
## [1] "kNN model k=31 Sensitivity=0.484536082474227"
## [1] "kNN model k=31 Specificity=0.97"
confusionMatrix(table(pred_objective, labels_test_objective))
## Confusion Matrix and Statistics
##
## labels_test_objective
## pred_objective 0 1
## 0 94 6
## 1 100 194
##
## Accuracy : 0.731
## 95% CI : (0.6843, 0.7741)
## No Information Rate : 0.5076
## P-Value [Acc > NIR] : < 2.2e-16
##
## Kappa : 0.4579
##
## Mcnemar's Test P-Value : < 2.2e-16
##
## Sensitivity : 0.4845
## Specificity : 0.9700
## Pos Pred Value : 0.9400
## Neg Pred Value : 0.6599
## Prevalence : 0.4924
## Detection Rate : 0.2386
## Detection Prevalence : 0.2538
## Balanced Accuracy : 0.7273
##
## 'Positive' Class : 0
##
# running the knn with the optimal k
= tune.knn(x = df_objective_train_onehot_new, y = as.factor(labels_train_objective), k = 1:new_k_objective)
tuning_objective tuning_objective
##
## Parameter tuning of 'knn.wrapper':
##
## - sampling method: 10-fold cross validation
##
## - best parameters:
## k
## 11
##
## - best performance: 0.2162944
<- tuning_objective$best.model$k
new_k_objective <- knn(train = df_objective_train_onehot_new, test = df_objective_test_onehot_new, cl = labels_train_objective, k = new_k_objective)
pred_objective <- CrossTable(x = labels_test_objective, y = pred_objective, prop.chisq = F) ct_objective
##
##
## Cell Contents
## |-------------------------|
## | N |
## | N / Row Total |
## | N / Col Total |
## | N / Table Total |
## |-------------------------|
##
##
## Total Observations in Table: 394
##
##
## | pred_objective
## labels_test_objective | 0 | 1 | Row Total |
## ----------------------|-----------|-----------|-----------|
## 0 | 106 | 88 | 194 |
## | 0.546 | 0.454 | 0.492 |
## | 0.891 | 0.320 | |
## | 0.269 | 0.223 | |
## ----------------------|-----------|-----------|-----------|
## 1 | 13 | 187 | 200 |
## | 0.065 | 0.935 | 0.508 |
## | 0.109 | 0.680 | |
## | 0.033 | 0.475 | |
## ----------------------|-----------|-----------|-----------|
## Column Total | 119 | 275 | 394 |
## | 0.302 | 0.698 | |
## ----------------------|-----------|-----------|-----------|
##
##
print_sensitivity_specificity(ct_objective, new_k_objective)
## [1] "kNN model k=11 Sensitivity=0.54639175257732"
## [1] "kNN model k=11 Specificity=0.935"
confusionMatrix(table(pred_objective, labels_test_objective))
## Confusion Matrix and Statistics
##
## labels_test_objective
## pred_objective 0 1
## 0 106 13
## 1 88 187
##
## Accuracy : 0.7437
## 95% CI : (0.6975, 0.7861)
## No Information Rate : 0.5076
## P-Value [Acc > NIR] : < 2.2e-16
##
## Kappa : 0.4842
##
## Mcnemar's Test P-Value : 1.795e-13
##
## Sensitivity : 0.5464
## Specificity : 0.9350
## Pos Pred Value : 0.8908
## Neg Pred Value : 0.6800
## Prevalence : 0.4924
## Detection Rate : 0.2690
## Detection Prevalence : 0.3020
## Balanced Accuracy : 0.7407
##
## 'Positive' Class : 0
##
# new_k_full <- 4 - in case the new k-value is 1
if(new_k_full < 2) new_k_full <- 4
# plot the silhouette with regular kmeans call
<- plot_silhouette(df_full_onehot, K=new_k_full, bKPP=F) returned_list_F_full
## [1] 9
## cluster size ave.sil.width
## 1 1 108 0.18
## 2 2 15 0.04
## 3 3 298 -0.01
## 4 4 70 -0.08
## 5 5 289 0.11
## 6 6 497 0.10
## 7 7 156 0.21
## 8 8 305 0.51
## 9 9 228 -0.05
1]] returned_list_F_full[[
# plot the silhouette with kpp call
<- plot_silhouette(df_full_onehot, K=new_k_full, bKPP=T) returned_list_T_full
## [1] 9
## cluster size ave.sil.width
## 1 1 109 0.20
## 2 2 305 0.52
## 3 3 145 -0.05
## 4 4 159 0.18
## 5 5 290 0.05
## 6 6 265 -0.02
## 7 7 54 -0.09
## 8 8 285 0.04
## 9 9 354 0.07
1]] returned_list_T_full[[
# if the kpp silhouette width >= kmeans width, then use the kpp algorithm
ifelse(returned_list_T_full[[3]] >= returned_list_F_full[[3]], bKPP_full <- T, bKPP_full <- F)
## [1] FALSE
# plot the tuning graph to visualize the elbow
plot_tuning(df_full_onehot, K=k_full_onehot, bKPP=bKPP_full)
# return and print the 1) average silhouette width, 2) silhouettes, 3) clusters
<- plot_silhouette(df_full_onehot, K=new_k_full, bKPP=bKPP_full) returned_list_full
## [1] 9
## cluster size ave.sil.width
## 1 1 108 0.18
## 2 2 15 0.04
## 3 3 298 -0.01
## 4 4 70 -0.08
## 5 5 289 0.11
## 6 6 497 0.10
## 7 7 156 0.21
## 8 8 305 0.51
## 9 9 228 -0.05
3]] returned_list_full[[
## [1] "0.13"
1]] returned_list_full[[
<- returned_list_full[[2]]
clusters_full <- matrix_centers_cleaned_up(clusters_full$centers)
new_centers_full # don't print the raw center data - illegible
# new_centers_full
###################################
# StrongInverseAssociation <= -2s
# InverseAssociation > -2s && <= -s
# Association >= s && < 2s
# StrongAssociation >= 2s
print_centers_summary(new_centers_full)
Cluster | StrongInverseAssociation | InverseAssociation | Association | StrongAssociation |
---|---|---|---|---|
Cluster 1 | [Current grade 02] + [# Days ate: dairy 02] + [# Days ate: fruit 02] + [# Days ate: veges 02] + [# Days ate: grains 02] + [# Days ate: sweets 02] + [# Days ate: meat 02] + [# Days ate: other protein 02] + [# Days pe class at sch 02] + [# Min exercising at sch 02] + [# Days exercise outside sch 02] + [Happy 02] + [Interest in life 02] + [Satisfied 02] + [Contribution 02] + [Community 02] + [Better place 02] + [People are good 02] + [Society works 02] + [Responsibilities 02] + [Warm relationships 02] + [Challenged you 02] + [Expressing ideas 02] + [Global self concept 02] + [Social initiative 02] + [Child age at assessment - months 02] | [Hours sleep per night 02] + [Condom use 02] + [Grade in sch] | [Sex of individual - Female] + [Sex of individual - Male] + [Self-identified race 2011 tas - White] + [L6 hispanicity - No] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Relation to head 01 - Son or daughter of head (includes adopted children but not stepchildren)] + [Hit you 02 - Not in the past month] + [Taken your things 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to father 02 - Extremely close] + [Close to stepmother 02 - Inap if q23h3c=5,8,9] + [Close to siblings 02 - Extremely close] + [Uncle 02 - No] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Other 02 - No] + [Relation to head 09 - Son or daughter of head (includes adopted children but not stepchildren)] + [Relation to head 11 - Son or daughter of head (includes adopted children but not stepchildren)] + [H61d wtr covered by insurance now 11 - 1] + [A1_1 how satisfied w/ life as a whole - Very satisfied] + [A1 wtr involved in arts - 0] + [A4 wtr member of sports team - 0] + [A12 wtr involved with school clubs - 0] + [A13 wtr did otr volunteer work - 0] + [B2 summer primary residence - Same as last winter] + [D8 wtr romantic relationship now - Not in romantic relationship] + [E1 employment status 1st mention - 0] + [E1 employment status 2nd mention - Inap.: no second mention] + [H4 wtr ever had asthma - 0] + [H8 wtr ever had high blood pressure - 0] + [H12 wtr ever had emotional/psych probs - 0] + [H12d wtr take nerve meds - NA] + [H14g wtr feelings more freq than usual - About the same as usual] + [H14h how much more freq than usual - NA] + [H15 wtr>2 wks depressed in past 12 mos - 0] + [H16 wtr>2 wks no interest in life - 0] + [H17 wtr had annual dr checkup last year - 1] + [H20b wtr covered by health insurance - Yes] + [H23b how often do light activities - Several times a week or more] + [H29 wtr smoke cigarettes - 0] + [H36 wtr drink alcohol-head - 0] + [H40c wtr ever taken marijuana - 0] + [H50 wtr ever had sexual intercourse - 1] + [L1a religious preference - Protestant] + [L4 wtr spiritual person - 1] + [Highest education level - High school graduate plus some college] + [L7 race mention #1 - White] + [L7 race mention #2 - NA] + [black2011 - 0] + [other2011 - 0] + [PositiveChange - Positive.Change] + [A10a wtr used internet for email] + [A10b wtr used internet for school] + [A10d wtr used internet for games] + [A10e wtr used internet for soc netwrking] + [B6a how good at responsibility] + [B6b how good at problem solving] + [C1a how good at supervising comp] + [C1b how good at leading comp w/otrs] + [C1c how good at logic comp w/otrs] + [C1d how good at helping comp w/otrs] + [C1e how intelligent compared w/otrs] + [C1f how independent compared w/otrs] + [C1g how confident compared w/others] + [C1h how decisive compared w/others] + [C1j how well listen compared w/others] + [C2a how often nervous meetng others] + [C2c how often feel self-conscious] + [C2g how often feel nervous performing] + [D41 how close to father] + [D46 how close to mother] + [H14a how often felt nervous in past mo] + [H27 # of hours of sleep in 24-hr period] + [H28a freq of snack instead of reglr meal] + [H28b frequency of binge eating] + [K3b2 pct of close friends in coll/grad] + [K3c pct of close friends unemp & looking] + [K3f pct of close friends in vo/tech pgm] + [K3n pct of close friends who use drugs] + [K11 how often did something dangerous] + [K12 how often damaged public property] + [L3 freq of attend relig svcs last 12 mos] + [M1 frequency of happiness in last month] + [M2 freq of interest in life in last mo] + [M3 freq of feeling satisfied in last mo] + [M5 freq of feeling belonging to communty] + [M8 freq feelng way soc works makes sense] + [M9 freq feel managng daily responsibilty] + [M10 freq feeling trusting rels w/others] + [M12 freq feeling confident of own ideas] + [M13 freq of feeling liked personality] + [M14 freq of feeling life had direction] + [Mental health: social anxiety] + [Mental health: risky behaviors] + [Completed education of mother] | [Close to stepfather 02 - Inap if q23h3d=5,8,9] |
Cluster 2 | [Year individual born 01] | [Sex of individual - Male] + [Self-identified race 2011 tas - Black or african american] + [L6 hispanicity - No] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Relation to head 01 - Son or daughter of head (includes adopted children but not stepchildren)] + [Picked on you 02 - Not in the past month] + [Hit you 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to father 02 - Na; refused] + [Close to stepfather 02 - Inap if q23h3d=5,8,9] + [Close to stepmother 02 - Inap if q23h3c=5,8,9] + [Close to friends 02 - Quite close] + [Close to siblings 02 - Extremely close] + [Close to teachers 02 - Fairly close] + [Aunt 02 - No] + [Uncle 02 - No] + [Grandparent 02 - No] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Friends parent 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Race/ethnicity 02 - African american] + [Spiritual? 02 - Inap if (not eligible for section j (age=8-11 yrs old)) or (q23j2=01-20,97)] + [Sports in 02 - Yes] + [Sports in 02 - No] + [Community groups 02 - No] + [Volunteer? 02 - No] + [Summer program 02 - No] + [Freq missed soc act due to hlth prob 02 - Never] + [Orderly 02 - Sometimes] + [Do best 02 - Always] + [Ever tried cigarettes 02 - No] + [Ever drank? 02 - No] + [# Friends who drink 02 - None; inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ever tried marijuana 02 - No] + [Partner 02 - Yes] + [Partner 02 - No] + [Sexual intercourse 02 - No] + [Relation to head 09 - Head in 2009; 2007 head who was mover-out nonresponse by the time of the 2009 interview] + [H60 wtr fu member w/hlth ins last 2 yrs - Yes, one or more persons covered] + [H61d wtr covered by insurance now 11 - 1] + [Result of cds/ta iw attempt 11 - Interview with eligible sample individual] + [A1 wtr involved in arts - 0] + [A4 wtr member of sports team - 0] + [A9 wtr ever used internet - 1] + [A11 wtr voted in 2010 - 0] + [A11b wtr in social action groups - 0] + [A12 wtr involved with school clubs - 0] + [A13 wtr did otr volunteer work - 0] + [B2 summer primary residence - Same as last winter] + [E1 employment status 1st mention - 0] + [E1 employment status 2nd mention - Inap.: no second mention] + [E1 employment status 3rd mention - Inap.: fewer than three mentions] + [E71a ever in armed forces - 0] + [G19 wtr non-academic training - 0] + [H4 wtr ever had asthma - 0] + [H8 wtr ever had high blood pressure - 0] + [H12 wtr ever had emotional/psych probs - 0] + [H14g wtr feelings more freq than usual - About the same as usual] + [H14h how much more freq than usual - NA] + [H15 wtr>2 wks depressed in past 12 mos - 0] + [H16 wtr>2 wks no interest in life - 0] + [H17 wtr had annual dr checkup last year - 1] + [H20b wtr covered by health insurance - Inap: r was head or wife/“wife” in the 2011 psid interview (ta110011=1 or 2)] + [H23a how often do vigorous activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H23b how often do light activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H23c how often musclebuilding activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H29 wtr smoke cigarettes - 0] + [H36 wtr drink alcohol-head - 0] + [H40a wtr ever taken diet pills - 0] + [H40b wtr ever taken amphetamines - 0] + [H40c wtr ever taken marijuana - 0] + [H40e wtr ever taken barbiturates - 0] + [H40f wtr ever taken tranquilizers - 0] + [H40g wtr ever taken steroids - 0] + [H50 wtr ever had sexual intercourse - 1] + [H53f diagnosed with std or hiv - Inap.: never had sexual intercourse (ta110969=5); na, dk, rf whether ever had sexual intercourse (ta110969=8 or 9); has never gone to see a doctor or nurse for std or hiv (ta110994=5); na, dk, rf whether ever gone to see a doctor or nurse for std or hiv (ta110994=8 or 9)] + [K4 wtr ever sexually assaulted/raped - No] + [K5a # times sexually assaulted - Inap.: never been sexually assaulted or raped (ta111021=5); na, dk, rf whether ever been sexually assaulted or raped (ta111021=8 or 9)] + [K6 wtr ever physically attacked - No] + [L1a religious preference - Protestant] + [L4 wtr spiritual person - 1] + [Marital/cohabitation status - 0] + [L7 race mention #1 - Black, african-american, or negro] + [black2011 - 1] + [other2011 - NA] + [PositiveChange - NA] + [Current grade 02] + [# Days ate: meat 02] + [Sexual intercourse: month 02] + [Sexual intercourse: year 02] + [Happy 02] + [Interest in life 02] + [Satisfied 02] + [Contribution 02] + [Community 02] + [People are good 02] + [Society works 02] + [Responsibilities 02] + [Warm relationships 02] + [Challenged you 02] + [Expressing ideas 02] + [Social initiative 02] + [H14f how often felt worthless in past mo] | [Close to stepfather 02 - Inap if q23h3d=5,8,9] | |
Cluster 3 | [Year individual born 01] | [Sex of individual - Female] + [Self-identified race 2011 tas - Black or african american] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Relation to head 01 - Son or daughter of head (includes adopted children but not stepchildren)] + [Picked on you 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to father 02 - Na; refused] + [Close to stepfather 02 - Inap if q23h3d=5,8,9] + [Close to stepmother 02 - Inap if q23h3c=5,8,9] + [Close to siblings 02 - Extremely close] + [Aunt 02 - No] + [Uncle 02 - No] + [Grandparent 02 - No] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Friends parent 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Other 02 - No] + [Race/ethnicity 02 - African american] + [Religious import 02 - Very important] + [Spiritual? 02 - Inap if (not eligible for section j (age=8-11 yrs old)) or (q23j2=01-20,97)] + [Sports in 02 - Yes] + [Sports in 02 - No] + [School groups 02 - Yes] + [School groups 02 - No] + [Community groups 02 - No] + [Volunteer? 02 - No] + [Summer program 02 - No] + [Freq missed soc act due to hlth prob 02 - Never] + [Freq missed school due to health prob 02 - Never] + [Do best 02 - Always] + [Do things as well as others 02 - Most of the time] + [Ever tried cigarettes 02 - Yes] + [Ever tried chew tobacco 02 - No] + [Ever drank? 02 - Yes] + [Ever tried marijuana 02 - Yes] + [Ever tried marijuana 02 - No] + [Partner 02 - Yes] + [H60 wtr fu member w/hlth ins last 2 yrs - Yes, one or more persons covered] + [Relation to head 11 - Head in 2011; 2009 head who was mover-out nonresponse by the time of the 2011 interview] + [H61d wtr covered by insurance now 11 - 1] + [Head-wife status - Ta respondent was head in the 2011 psid interview] + [A4 wtr member of sports team - 0] + [A11 wtr voted in 2010 - 0] + [A13 wtr did otr volunteer work - 0] + [B1 fall/winter primary residence - Apartment or room that r rented] + [B2 summer primary residence - Same as last winter] + [D8 wtr romantic relationship now - Married or cohabitating] + [E1 employment status 1st mention - 1] + [E1 employment status 2nd mention - Inap.: no second mention] + [G19 wtr non-academic training - 0] + [G20 wtr currently in vo/tech training - NA] + [H4 wtr ever had asthma - 0] + [H8 wtr ever had high blood pressure - 0] + [H14g wtr feelings more freq than usual - About the same as usual] + [H14h how much more freq than usual - NA] + [H14j how much interferes with activities - Not at all] + [H16 wtr>2 wks no interest in life - 0] + [H17 wtr had annual dr checkup last year - 1] + [H20b wtr covered by health insurance - Inap: r was head or wife/“wife” in the 2011 psid interview (ta110011=1 or 2)] + [H23a how often do vigorous activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H23b how often do light activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H23c how often musclebuilding activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H23a time unit for hvy phys activity–hw - Inap.: was not head or wife/“wife” in 2011 psid interview (ta110011=3); never does vigorous activities for at least 10 minutes that cause heavy sweating or large increase in breathing or heart rate (ta110893=0)] + [H29 wtr smoke cigarettes - 0] + [H36 wtr drink alcohol-head - 1] + [H40a wtr ever taken diet pills - 0] + [H40c wtr ever taken marijuana - 1] + [H40f wtr ever taken tranquilizers - 0] + [H53f diagnosed with std or hiv - Inap.: never had sexual intercourse (ta110969=5); na, dk, rf whether ever had sexual intercourse (ta110969=8 or 9); has never gone to see a doctor or nurse for std or hiv (ta110994=5); na, dk, rf whether ever gone to see a doctor or nurse for std or hiv (ta110994=8 or 9)] + [L1a religious preference - Protestant] + [L4 wtr spiritual person - 1] + [Marital/cohabitation status - 0] + [Marital/cohabitation status - 1] + [Region - South] + [L7 race mention #1 - Black, african-american, or negro] + [black2011 - 1] + [other2011 - NA] + [PositiveChange - Positive.Change] + [# Days ate: sweets 02] + [# Days ate: meat 02] + [Sexual intercourse: month 02] + [Happy 02] + [Interest in life 02] + [Satisfied 02] + [Contribution 02] + [Community 02] + [Better place 02] + [People are good 02] + [Society works 02] + [Responsibilities 02] + [Warm relationships 02] + [Challenged you 02] + [Expressing ideas 02] + [Global self concept 02] + [Social initiative 02] + [Grade in sch] + [A6 how often watched or read news] + [A7 how often read for pleasure] + [A8 how often watch non-news tv] + [A10a wtr used internet for email] + [B5a how much resonsiblty earng own livng] + [B5b how much responsiblty payng own rent] + [B5c how much responsblty for own bills] + [B5d how much responsiblty managing money] + [B6a how good at responsibility] + [B6b how good at problem solving] + [B6c how good at money management] + [C1a how good at supervising comp] + [C1b how good at leading comp w/otrs] + [C1c how good at logic comp w/otrs] + [C1d how good at helping comp w/otrs] + [C1e how intelligent compared w/otrs] + [C1f how independent compared w/otrs] + [C1g how confident compared w/others] + [C1h how decisive compared w/others] + [C1j how well listen compared w/others] + [C1k how good at teaching compared w/otrs] + [D11 how satisfied w/relationship] + [D46 how close to mother] + [H28a freq of snack instead of reglr meal] + [H30 # cigarettes per day] + [H37 how often have drinks-hd] + [K1b how often receive poorer service] + [K1e how often others treat as dishonest] + [K3a pct of close friends w/job not coll] + [K3e pct of close friends married, etc.] + [K3h pct of close friends w/kids] + [K3m pct of close friends who get drunk] + [K3n pct of close friends who use drugs] + [K13 how often got into physical fight] + [K15 how often drove when drunk or high] + [M1 frequency of happiness in last month] + [M2 freq of interest in life in last mo] + [M3 freq of feeling satisfied in last mo] + [M4 freq of feeling contrib to society] + [M6 freq of feeling society gettng better] + [M9 freq feel managng daily responsibilty] + [M10 freq feeling trusting rels w/others] + [M11 freq of feeling challenged to grow] + [M12 freq feeling confident of own ideas] + [M13 freq of feeling liked personality] + [M14 freq of feeling life had direction] + [Responsibilities: financial] + [Mental health: risky behaviors] + [Body weight percentile status] + [Earnings from work last year] + [L8 importance of ethnic group identity] | [Close to stepfather 02 - Inap if q23h3d=5,8,9] | |
Cluster 4 | [Current grade 02] + [Happy 02] + [Interest in life 02] + [Satisfied 02] + [Contribution 02] + [Community 02] + [People are good 02] + [Responsibilities 02] + [Warm relationships 02] + [Challenged you 02] + [Expressing ideas 02] + [Social initiative 02] | [Better place 02] + [Society works 02] + [Grade in sch] + [Child age at assessment - months 02] | [Sex of individual - Male] + [Self-identified race 2011 tas - White] + [L6 hispanicity - No] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Relation to head 01 - Son or daughter of head (includes adopted children but not stepchildren)] + [Hit you 02 - Not in the past month] + [Taken your things 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to father 02 - Na; refused] + [Close to stepfather 02 - Inap if q23h3d=5,8,9] + [Close to stepmother 02 - Inap if q23h3c=5,8,9] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Other 02 - No] + [Sports in 02 - No] + [School groups 02 - Yes] + [School groups 02 - No] + [Community groups 02 - No] + [Volunteer? 02 - No] + [Summer program 02 - Yes] + [Freq missed school due to health prob 02 - Never] + [Do best 02 - Always] + [Relation to head 09 - Son or daughter of head (includes adopted children but not stepchildren)] + [Highest education level - NA] + [Relation to head 11 - Son or daughter of head (includes adopted children but not stepchildren)] + [H61d wtr covered by insurance now 11 - 1] + [Head-wife status - Ta respondent was an ofum in the 2011 psid interview] + [A1_1 how satisfied w/ life as a whole - Somewhat satisfied] + [A1 wtr involved in arts - 0] + [A4 wtr member of sports team - 0] + [A12 wtr involved with school clubs - 0] + [A13 wtr did otr volunteer work - 0] + [B1 fall/winter primary residence - Parents home (house or apartment)] + [B2 summer primary residence - Same as last winter] + [D8 wtr romantic relationship now - Not in romantic relationship] + [E1 employment status 1st mention - 0] + [E1 employment status 1st mention - 1] + [E1 employment status 2nd mention - Inap.: no second mention] + [G19 wtr non-academic training - 0] + [G20 wtr currently in vo/tech training - NA] + [H4 wtr ever had asthma - 0] + [H12 wtr ever had emotional/psych probs - 0] + [H12d wtr take nerve meds - NA] + [H14g wtr feelings more freq than usual - About the same as usual] + [H14h how much more freq than usual - NA] + [H15 wtr>2 wks depressed in past 12 mos - 0] + [H15 wtr>2 wks depressed in past 12 mos - 1] + [H16 wtr>2 wks no interest in life - NA] + [H17 wtr had annual dr checkup last year - 1] + [H20b wtr covered by health insurance - Yes] + [H23a time unit for hvy phys activity–hw - Inap.: was not head or wife/“wife” in 2011 psid interview (ta110011=3); never does vigorous activities for at least 10 minutes that cause heavy sweating or large increase in breathing or heart rate (ta110893=0)] + [H29 wtr smoke cigarettes - 0] + [H36 wtr drink alcohol-head - 1] + [H40a wtr ever taken diet pills - 0] + [H40b wtr ever taken amphetamines - 0] + [H40c wtr ever taken marijuana - 1] + [H40e wtr ever taken barbiturates - 0] + [H40f wtr ever taken tranquilizers - 0] + [H50 wtr ever had sexual intercourse - 1] + [H53f diagnosed with std or hiv - Inap.: never had sexual intercourse (ta110969=5); na, dk, rf whether ever had sexual intercourse (ta110969=8 or 9); has never gone to see a doctor or nurse for std or hiv (ta110994=5); na, dk, rf whether ever gone to see a doctor or nurse for std or hiv (ta110994=8 or 9)] + [K4 wtr ever sexually assaulted/raped - No] + [K5a # times sexually assaulted - Inap.: never been sexually assaulted or raped (ta111021=5); na, dk, rf whether ever been sexually assaulted or raped (ta111021=8 or 9)] + [K6 wtr ever physically attacked - Yes] + [K6 wtr ever physically attacked - No] + [L1a religious preference - Protestant] + [L4 wtr spiritual person - 0] + [L4 wtr spiritual person - 1] + [Marital/cohabitation status - 0] + [Region - South] + [L7 race mention #1 - White] + [L7 race mention #1 - Black, african-american, or negro] + [black2011 - 0] + [black2011 - 1] + [other2011 - NA] + [other2011 - 0] + [PositiveChange - NA] + [# Days ate: other protein 02] + [# Days exercise outside sch 02] + [Hours sleep per night 02] + [Peer bullying 02] + [A10d wtr used internet for games] + [A10e wtr used internet for soc netwrking] + [B5a how much resonsiblty earng own livng] + [B5d how much responsiblty managing money] + [B6a how good at responsibility] + [B6b how good at problem solving] + [C1c how good at logic comp w/otrs] + [C1d how good at helping comp w/otrs] + [C1e how intelligent compared w/otrs] + [C1f how independent compared w/otrs] + [C1j how well listen compared w/others] + [C2a how often nervous meetng others] + [C2b how often feel shy] + [C2c how often feel self-conscious] + [C2g how often feel nervous performing] + [H12a age first diagnosed w/psych probs] + [H27 # of hours of sleep in 24-hr period] + [H28a freq of snack instead of reglr meal] + [H30 # cigarettes per day] + [H51e # of sexual intercourse partners] + [K1b how often receive poorer service] + [K1e how often others treat as dishonest] + [K3c pct of close friends unemp & looking] + [K3f pct of close friends in vo/tech pgm] + [K3h pct of close friends w/kids] + [K3m pct of close friends who get drunk] + [K12 how often damaged public property] + [K15 how often drove when drunk or high] + [Mental health: social anxiety] + [Body weight percentile status] + [Completed education of mother] + [Year individual born 01] | [Close to stepfather 02 - Inap if q23h3d=5,8,9] |
Cluster 5 | [Current grade 02] + [Happy 02] + [Interest in life 02] + [Satisfied 02] + [Contribution 02] + [Community 02] + [Better place 02] + [People are good 02] + [Society works 02] + [Responsibilities 02] + [Warm relationships 02] + [Challenged you 02] + [Expressing ideas 02] + [Social initiative 02] | [Condom use 02] + [Grade in sch] + [Child age at assessment - months 02] | [Sex of individual - Female] + [Sex of individual - Male] + [L6 hispanicity - No] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Relation to head 01 - Son or daughter of head (includes adopted children but not stepchildren)] + [Picked on you 02 - Not in the past month] + [Hit you 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to stepfather 02 - Inap if q23h3d=5,8,9] + [Close to stepmother 02 - Inap if q23h3c=5,8,9] + [Close to siblings 02 - Extremely close] + [Aunt 02 - No] + [Uncle 02 - No] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Friends parent 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Other 02 - No] + [Sports in 02 - Yes] + [Sports in 02 - No] + [School groups 02 - No] + [Community groups 02 - No] + [Volunteer? 02 - No] + [Summer program 02 - Yes] + [Summer program 02 - No] + [Freq missed soc act due to hlth prob 02 - Never] + [Freq missed school due to health prob 02 - Never] + [Do best 02 - Always] + [Relation to head 09 - Son or daughter of head (includes adopted children but not stepchildren)] + [Highest education level - NA] + [H60 wtr fu member w/hlth ins last 2 yrs - Yes, one or more persons covered] + [Relation to head 11 - Son or daughter of head (includes adopted children but not stepchildren)] + [H61d wtr covered by insurance now 11 - 1] + [Head-wife status - Ta respondent was an ofum in the 2011 psid interview] + [A1_1 how satisfied w/ life as a whole - Very satisfied] + [A1 wtr involved in arts - 0] + [A4 wtr member of sports team - 0] + [A11 wtr voted in 2010 - 0] + [A12 wtr involved with school clubs - 0] + [A13 wtr did otr volunteer work - 0] + [B1 fall/winter primary residence - Parents home (house or apartment)] + [B2 summer primary residence - Same as last winter] + [D8 wtr romantic relationship now - Not in romantic relationship] + [E1 employment status 1st mention - 0] + [E1 employment status 1st mention - 1] + [E1 employment status 2nd mention - Inap.: no second mention] + [H1 health level - Very good] + [H4 wtr ever had asthma - 0] + [H14g wtr feelings more freq than usual - About the same as usual] + [H14h how much more freq than usual - NA] + [H14j how much interferes with activities - Not at all] + [H16 wtr>2 wks no interest in life - 0] + [H17 wtr had annual dr checkup last year - 1] + [H20b wtr covered by health insurance - Yes] + [H36 wtr drink alcohol-head - 0] + [H40c wtr ever taken marijuana - 0] + [H50 wtr ever had sexual intercourse - 1] + [H53f diagnosed with std or hiv - Inap.: never had sexual intercourse (ta110969=5); na, dk, rf whether ever had sexual intercourse (ta110969=8 or 9); has never gone to see a doctor or nurse for std or hiv (ta110994=5); na, dk, rf whether ever gone to see a doctor or nurse for std or hiv (ta110994=8 or 9)] + [L1a religious preference - Protestant] + [L4 wtr spiritual person - 1] + [Marital/cohabitation status - 0] + [Region - South] + [Highest education level - High school graduate plus some college] + [L7 race mention #1 - White] + [black2011 - 0] + [other2011 - 0] + [PositiveChange - Positive.Change] + [# Min exercising at sch 02] + [# Days exercise outside sch 02] + [Global self concept 02] + [A8 how often watch non-news tv] + [A10a wtr used internet for email] + [A10b wtr used internet for school] + [A10c wtr used internet to shop] + [A10e wtr used internet for soc netwrking] + [B5d how much responsiblty managing money] + [B6a how good at responsibility] + [B6b how good at problem solving] + [B6c how good at money management] + [C1a how good at supervising comp] + [C1b how good at leading comp w/otrs] + [C1c how good at logic comp w/otrs] + [C1d how good at helping comp w/otrs] + [C1e how intelligent compared w/otrs] + [C1f how independent compared w/otrs] + [C1g how confident compared w/others] + [C1h how decisive compared w/others] + [C1j how well listen compared w/others] + [C1k how good at teaching compared w/otrs] + [C2g how often feel nervous performing] + [D41 how close to father] + [D46 how close to mother] + [H27 # of hours of sleep in 24-hr period] + [H28a freq of snack instead of reglr meal] + [K3b2 pct of close friends in coll/grad] + [K3c pct of close friends unemp & looking] + [K3f pct of close friends in vo/tech pgm] + [K12 how often damaged public property] + [K13 how often got into physical fight] + [L3 freq of attend relig svcs last 12 mos] + [M1 frequency of happiness in last month] + [M2 freq of interest in life in last mo] + [M3 freq of feeling satisfied in last mo] + [M4 freq of feeling contrib to society] + [M5 freq of feeling belonging to communty] + [M6 freq of feeling society gettng better] + [M7 freq of feeling people basically good] + [M8 freq feelng way soc works makes sense] + [M9 freq feel managng daily responsibilty] + [M10 freq feeling trusting rels w/others] + [M11 freq of feeling challenged to grow] + [M12 freq feeling confident of own ideas] + [M13 freq of feeling liked personality] + [M14 freq of feeling life had direction] + [Completed education of mother] + [Year individual born 01] + [L8 importance of ethnic group identity] | [Close to stepfather 02 - Inap if q23h3d=5,8,9] |
Cluster 6 | [Condom use 02] | [Sex of individual - Female] + [Self-identified race 2011 tas - White] + [L6 hispanicity - No] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Picked on you 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to stepmother 02 - Inap if q23h3c=5,8,9] + [Aunt 02 - No] + [Uncle 02 - No] + [Grandparent 02 - No] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Friends parent 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Other 02 - No] + [Spiritual? 02 - Inap if (not eligible for section j (age=8-11 yrs old)) or (q23j2=01-20,97)] + [Sports in 02 - Yes] + [School groups 02 - Yes] + [School groups 02 - No] + [Community groups 02 - No] + [Volunteer? 02 - No] + [Summer program 02 - No] + [Freq missed soc act due to hlth prob 02 - Never] + [Freq missed school due to health prob 02 - Never] + [Stay with task 02 - Most of the time] + [Do best 02 - Always] + [Finish things 02 - Most of the time] + [Do things as well as others 02 - Most of the time] + [Ever tried cigarettes 02 - No] + [Ever drank? 02 - No] + [# Friends who drink 02 - None; inap if not eligible for acasi section l (age=8-11 yrs old)] + [Partner 02 - No] + [Relation to head 09 - Son or daughter of head (includes adopted children but not stepchildren)] + [Highest education level - High school graduate plus some college] + [H60 wtr fu member w/hlth ins last 2 yrs - Yes, one or more persons covered] + [Relation to head 11 - Son or daughter of head (includes adopted children but not stepchildren)] + [H61d wtr covered by insurance now 11 - 1] + [Head-wife status - Ta respondent was an ofum in the 2011 psid interview] + [A1_1 how satisfied w/ life as a whole - Very satisfied] + [A1 wtr involved in arts - 0] + [A4 wtr member of sports team - 0] + [A11 wtr voted in 2010 - 0] + [A12 wtr involved with school clubs - 0] + [A13 wtr did otr volunteer work - 0] + [B2 summer primary residence - Same as last winter] + [E1 employment status 1st mention - 1] + [E1 employment status 2nd mention - Inap.: no second mention] + [G19 wtr non-academic training - 0] + [G20 wtr currently in vo/tech training - NA] + [H1 health level - Very good] + [H4 wtr ever had asthma - 0] + [H14g wtr feelings more freq than usual - About the same as usual] + [H14h how much more freq than usual - NA] + [H14j how much interferes with activities - Not at all] + [H17 wtr had annual dr checkup last year - 1] + [H23a time unit for hvy phys activity–hw - Inap.: was not head or wife/“wife” in 2011 psid interview (ta110011=3); never does vigorous activities for at least 10 minutes that cause heavy sweating or large increase in breathing or heart rate (ta110893=0)] + [H36 wtr drink alcohol-head - 1] + [H40a wtr ever taken diet pills - 0] + [H40b wtr ever taken amphetamines - 0] + [H40c wtr ever taken marijuana - 0] + [H50 wtr ever had sexual intercourse - 1] + [H53f diagnosed with std or hiv - Inap.: never had sexual intercourse (ta110969=5); na, dk, rf whether ever had sexual intercourse (ta110969=8 or 9); has never gone to see a doctor or nurse for std or hiv (ta110994=5); na, dk, rf whether ever gone to see a doctor or nurse for std or hiv (ta110994=8 or 9)] + [L1a religious preference - Protestant] + [L4 wtr spiritual person - 1] + [Marital/cohabitation status - 0] + [Highest education level - Skipped, asked in ta-09] + [L7 race mention #1 - White] + [black2011 - 0] + [other2011 - 0] + [PositiveChange - Positive.Change] + [Current grade 02] + [# Days ate: dairy 02] + [# Days ate: grains 02] + [Happy 02] + [Interest in life 02] + [Satisfied 02] + [Contribution 02] + [Community 02] + [Better place 02] + [People are good 02] + [Society works 02] + [Responsibilities 02] + [Warm relationships 02] + [Challenged you 02] + [Expressing ideas 02] + [Global self concept 02] + [Social initiative 02] + [A6 how often watched or read news] + [A7 how often read for pleasure] + [A8 how often watch non-news tv] + [A10a wtr used internet for email] + [A10b wtr used internet for school] + [A10c wtr used internet to shop] + [A10e wtr used internet for soc netwrking] + [B5a how much resonsiblty earng own livng] + [B5b how much responsiblty payng own rent] + [B5c how much responsblty for own bills] + [B5d how much responsiblty managing money] + [B6a how good at responsibility] + [B6b how good at problem solving] + [B6c how good at money management] + [B6d how good at credit card payoff] + [C1a how good at supervising comp] + [C1b how good at leading comp w/otrs] + [C1c how good at logic comp w/otrs] + [C1d how good at helping comp w/otrs] + [C1e how intelligent compared w/otrs] + [C1f how independent compared w/otrs] + [C1g how confident compared w/others] + [C1h how decisive compared w/others] + [C1j how well listen compared w/others] + [C1k how good at teaching compared w/otrs] + [D41 how close to father] + [D46 how close to mother] + [H27 # of hours of sleep in 24-hr period] + [H28a freq of snack instead of reglr meal] + [H37 how often have drinks-hd] + [K3a pct of close friends w/job not coll] + [K3b2 pct of close friends in coll/grad] + [K3e pct of close friends married, etc.] + [K12 how often damaged public property] + [M1 frequency of happiness in last month] + [M2 freq of interest in life in last mo] + [M3 freq of feeling satisfied in last mo] + [M4 freq of feeling contrib to society] + [M5 freq of feeling belonging to communty] + [M6 freq of feeling society gettng better] + [M7 freq of feeling people basically good] + [M8 freq feelng way soc works makes sense] + [M9 freq feel managng daily responsibilty] + [M10 freq feeling trusting rels w/others] + [M11 freq of feeling challenged to grow] + [M12 freq feeling confident of own ideas] + [M13 freq of feeling liked personality] + [M14 freq of feeling life had direction] + [Responsibilities: financial] + [Completed education of mother] + [Completed education of father] | [Close to stepfather 02 - Inap if q23h3d=5,8,9] | |
Cluster 7 | [A6 how often watched or read news] + [A7 how often read for pleasure] + [A8 how often watch non-news tv] + [A10a wtr used internet for email] + [A10b wtr used internet for school] + [A10c wtr used internet to shop] + [A10d wtr used internet for games] + [A10e wtr used internet for soc netwrking] + [B5a how much resonsiblty earng own livng] + [B5b how much responsiblty payng own rent] + [B5c how much responsblty for own bills] + [B5d how much responsiblty managing money] + [B6a how good at responsibility] + [B6b how good at problem solving] + [B6c how good at money management] + [B6d how good at credit card payoff] + [C1a how good at supervising comp] + [C1b how good at leading comp w/otrs] + [C1c how good at logic comp w/otrs] + [C1d how good at helping comp w/otrs] + [C1e how intelligent compared w/otrs] + [C1f how independent compared w/otrs] + [C1g how confident compared w/others] + [C1h how decisive compared w/others] + [C1j how well listen compared w/others] + [C1k how good at teaching compared w/otrs] + [C2a how often nervous meetng others] + [C2b how often feel shy] + [C2c how often feel self-conscious] + [C2g how often feel nervous performing] + [D28a number of children] + [D41 how close to father] + [D46 how close to mother] + [H14a how often felt nervous in past mo] + [H14b how often felt hopeless in past mo] + [H14c how often felt restless in past mo] + [H14d how often felt everything effort] + [H14e how often felt too sad in past mo] + [H14f how often felt worthless in past mo] + [H27 # of hours of sleep in 24-hr period] + [H28a freq of snack instead of reglr meal] + [H28b frequency of binge eating] + [H37 how often have drinks-hd] + [K1a how often treated with less courtesy] + [K1b how often receive poorer service] + [K1c how often others treat as stupid] + [K1d how often others act afraid] + [K1e how often others treat as dishonest] + [K1f how often others act superior] + [K1k how often treated with less respect] + [K3a pct of close friends w/job not coll] + [K3b2 pct of close friends in coll/grad] + [K3c pct of close friends unemp & looking] + [K3e pct of close friends married, etc.] + [K3f pct of close friends in vo/tech pgm] + [K3h pct of close friends w/kids] + [K3m pct of close friends who get drunk] + [K3n pct of close friends who use drugs] + [K11 how often did something dangerous] + [K12 how often damaged public property] + [K13 how often got into physical fight] + [K15 how often drove when drunk or high] + [L3 freq of attend relig svcs last 12 mos] + [M1 frequency of happiness in last month] + [M2 freq of interest in life in last mo] + [M3 freq of feeling satisfied in last mo] + [M4 freq of feeling contrib to society] + [M5 freq of feeling belonging to communty] + [M6 freq of feeling society gettng better] + [M7 freq of feeling people basically good] + [M8 freq feelng way soc works makes sense] + [M9 freq feel managng daily responsibilty] + [M10 freq feeling trusting rels w/others] + [M11 freq of feeling challenged to grow] + [M12 freq feeling confident of own ideas] + [M13 freq of feeling liked personality] + [M14 freq of feeling life had direction] + [Responsibilities: financial] + [Mental health: worry] + [Mental health: social anxiety] + [Mental health: non-spec psych distress] + [Mental health: risky behaviors] + [Body weight percentile status] + [Completed education of mother] + [Completed education of father] + [L8 importance of ethnic group identity] | [D11 how satisfied w/relationship] + [H30 # cigarettes per day] + [K5b age when (first) assaulted] + [Enrollment status] + [Earnings from work last year] + [Year individual born 01] | [Sex of individual - Male] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Relation to head 01 - Son or daughter of head (includes adopted children but not stepchildren)] + [Picked on you 02 - Not in the past month] + [Hit you 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to stepmother 02 - Inap if q23h3c=5,8,9] + [Aunt 02 - No] + [Uncle 02 - No] + [Grandparent 02 - No] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Friends parent 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Other 02 - No] + [Spiritual? 02 - Inap if (not eligible for section j (age=8-11 yrs old)) or (q23j2=01-20,97)] + [Sports in 02 - Yes] + [School groups 02 - No] + [Community groups 02 - No] + [Volunteer? 02 - No] + [Summer program 02 - No] + [Freq missed soc act due to hlth prob 02 - Never] + [Freq missed school due to health prob 02 - Never] + [Stay with task 02 - Most of the time] + [Finish things 02 - Most of the time] + [Ever tried cigarettes 02 - No] + [Ever tried chew tobacco 02 - No] + [Ever drank? 02 - Yes] + [# Friends who drink 02 - None; inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ever tried marijuana 02 - No] + [Partner 02 - Yes] + [Partner 02 - No] + [Sexual intercourse 02 - No] + [Relation to head 09 - Son or daughter of head (includes adopted children but not stepchildren)] + [H60 wtr fu member w/hlth ins last 2 yrs - Yes, one or more persons covered] + [H61d wtr covered by insurance now 11 - NA] + [PositiveChange - NA] + [Current grade 02] + [Condom use 02] + [Happy 02] + [Interest in life 02] + [Satisfied 02] + [Contribution 02] + [Community 02] + [Better place 02] + [People are good 02] + [Society works 02] + [Responsibilities 02] + [Warm relationships 02] + [Challenged you 02] + [Expressing ideas 02] + [Social initiative 02] + [Grade in sch] + [Child age at assessment - months 02] | [Close to stepfather 02 - Inap if q23h3d=5,8,9] |
Cluster 8 | [Current grade 02] + [# Days ate: dairy 02] + [# Days ate: fruit 02] + [# Days ate: veges 02] + [# Days ate: grains 02] + [# Days ate: sweets 02] + [# Days ate: meat 02] + [# Days ate: other protein 02] + [Happy 02] + [Interest in life 02] + [Satisfied 02] + [Contribution 02] + [Community 02] + [Better place 02] + [People are good 02] + [Society works 02] + [Responsibilities 02] + [Warm relationships 02] + [Challenged you 02] + [Expressing ideas 02] + [Global self concept 02] + [Social initiative 02] + [Child age at assessment - months 02] + [A6 how often watched or read news] + [A7 how often read for pleasure] + [A8 how often watch non-news tv] + [A10a wtr used internet for email] + [A10b wtr used internet for school] + [A10c wtr used internet to shop] + [A10d wtr used internet for games] + [A10e wtr used internet for soc netwrking] + [B5a how much resonsiblty earng own livng] + [B5b how much responsiblty payng own rent] + [B5c how much responsblty for own bills] + [B5d how much responsiblty managing money] + [B6a how good at responsibility] + [B6b how good at problem solving] + [B6c how good at money management] + [B6d how good at credit card payoff] + [C1a how good at supervising comp] + [C1b how good at leading comp w/otrs] + [C1c how good at logic comp w/otrs] + [C1d how good at helping comp w/otrs] + [C1e how intelligent compared w/otrs] + [C1f how independent compared w/otrs] + [C1g how confident compared w/others] + [C1h how decisive compared w/others] + [C1j how well listen compared w/others] + [C1k how good at teaching compared w/otrs] + [C2a how often nervous meetng others] + [C2b how often feel shy] + [C2c how often feel self-conscious] + [C2g how often feel nervous performing] + [D28a number of children] + [D41 how close to father] + [D46 how close to mother] + [H14a how often felt nervous in past mo] + [H14b how often felt hopeless in past mo] + [H14c how often felt restless in past mo] + [H14d how often felt everything effort] + [H14e how often felt too sad in past mo] + [H14f how often felt worthless in past mo] + [H27 # of hours of sleep in 24-hr period] + [H28a freq of snack instead of reglr meal] + [H28b frequency of binge eating] + [H37 how often have drinks-hd] + [K1a how often treated with less courtesy] + [K1b how often receive poorer service] + [K1c how often others treat as stupid] + [K1d how often others act afraid] + [K1e how often others treat as dishonest] + [K1f how often others act superior] + [K1k how often treated with less respect] + [K3a pct of close friends w/job not coll] + [K3b2 pct of close friends in coll/grad] + [K3c pct of close friends unemp & looking] + [K3e pct of close friends married, etc.] + [K3f pct of close friends in vo/tech pgm] + [K3h pct of close friends w/kids] + [K3m pct of close friends who get drunk] + [K3n pct of close friends who use drugs] + [K11 how often did something dangerous] + [K12 how often damaged public property] + [K13 how often got into physical fight] + [K15 how often drove when drunk or high] + [L3 freq of attend relig svcs last 12 mos] + [M1 frequency of happiness in last month] + [M2 freq of interest in life in last mo] + [M3 freq of feeling satisfied in last mo] + [M4 freq of feeling contrib to society] + [M5 freq of feeling belonging to communty] + [M6 freq of feeling society gettng better] + [M7 freq of feeling people basically good] + [M8 freq feelng way soc works makes sense] + [M9 freq feel managng daily responsibilty] + [M10 freq feeling trusting rels w/others] + [M11 freq of feeling challenged to grow] + [M12 freq feeling confident of own ideas] + [M13 freq of feeling liked personality] + [M14 freq of feeling life had direction] + [Responsibilities: financial] + [Mental health: worry] + [Mental health: social anxiety] + [Mental health: non-spec psych distress] + [Mental health: risky behaviors] + [Body weight percentile status] + [Completed education of mother] + [Completed education of father] + [L8 importance of ethnic group identity] | [# Days pe class at sch 02] + [# Min exercising at sch 02] + [# Days exercise outside sch 02] + [Hours sleep per night 02] + [Condom use 02] + [Grade in sch] + [D11 how satisfied w/relationship] + [H30 # cigarettes per day] + [K5b age when (first) assaulted] + [Enrollment status] + [Earnings from work last year] | [Sex of individual - Female] + [Sex of individual - Male] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Relation to head 01 - Son or daughter of head (includes adopted children but not stepchildren)] + [Picked on you 02 - Not in the past month] + [Hit you 02 - Not in the past month] + [Taken your things 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to stepmother 02 - Inap if q23h3c=5,8,9] + [Close to siblings 02 - Extremely close] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Friends parent 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Other 02 - No] + [Sports in 02 - Inap if not eligible for acasi section k (age=8-9 yrs old)] + [School groups 02 - Inap if not eligible for acasi section k (age=8-9 yrs old)] + [Community groups 02 - Inap if not eligible for acasi section k (age=8-9 yrs old)] + [Volunteer? 02 - Inap if not eligible for acasi section k (age=8-9 yrs old)] + [Summer program 02 - Inap if not eligible for acasi section k (age=8-9 yrs old)] + [Self-rated health 02 - Inap if not eligible for acasi section k (age=8-9 yrs old)] + [Freq missed soc act due to hlth prob 02 - Inap if not eligible for acasi section k (age=8-9 yrs old)] + [Freq missed school due to health prob 02 - Inap if not eligible for acasi section k (age=8-9 yrs old)] + [Stay with task 02 - Inap if not eligible for acasi section k (age=8-9 yrs old)] + [Solve difficult tasks 02 - Inap if not eligible for acasi section k (age=8-9 yrs old)] + [Orderly 02 - Inap if not eligible for acasi section k (age=8-9 yrs old)] + [Do best 02 - Inap if not eligible for acasi section k (age=8-9 yrs old)] + [Finish things 02 - Inap if not eligible for acasi section k (age=8-9 yrs old)] + [Do things as well as others 02 - Inap if not eligible for acasi section k (age=8-9 yrs old)] + [Relation to head 09 - Son or daughter of head (includes adopted children but not stepchildren)] + [H60 wtr fu member w/hlth ins last 2 yrs - Yes, one or more persons covered] + [Relation to head 11 - Son or daughter of head (includes adopted children but not stepchildren)] + [H61d wtr covered by insurance now 11 - 1] + [Result of cds/ta iw attempt 11 - Inap.: this individual was from latino sample (er30001=7001-9308); from immigrant 2017 sample (er30001=4001-4462); not interviewed as part of 1997 cds (er33420=00, 02-98); main family nonresponse by 2011 (er34101=0 and er34102=0); mover-out nonresponse in 2011 (er34102=71-89)] + [Peer bullying 02] | [Close to stepfather 02 - Inap if q23h3d=5,8,9] |
Cluster 9 | [Year individual born 01] | [Sex of individual - Female] + [Sex of individual - Male] + [Self-identified race 2011 tas - White] + [L6 hispanicity - No] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Relation to head 01 - Son or daughter of head (includes adopted children but not stepchildren)] + [Picked on you 02 - Not in the past month] + [Hit you 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to stepfather 02 - Inap if q23h3d=5,8,9] + [Close to stepmother 02 - Inap if q23h3c=5,8,9] + [Uncle 02 - No] + [Grandparent 02 - No] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Friends parent 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Other 02 - No] + [Spiritual? 02 - Inap if (not eligible for section j (age=8-11 yrs old)) or (q23j2=01-20,97)] + [Sports in 02 - Yes] + [Sports in 02 - No] + [School groups 02 - No] + [Community groups 02 - No] + [Volunteer? 02 - No] + [Summer program 02 - No] + [Freq missed soc act due to hlth prob 02 - Never] + [Freq missed school due to health prob 02 - Never] + [Do things as well as others 02 - Most of the time] + [Ever tried cigarettes 02 - No] + [Ever drank? 02 - Yes] + [Ever drank? 02 - No] + [# Friends who drink 02 - None; inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ever tried marijuana 02 - No] + [Partner 02 - No] + [Sexual intercourse 02 - No] + [Relation to head 09 - Son or daughter of head (includes adopted children but not stepchildren)] + [H60 wtr fu member w/hlth ins last 2 yrs - Yes, one or more persons covered] + [H61d wtr covered by insurance now 11 - 1] + [Head-wife status - Ta respondent was an ofum in the 2011 psid interview] + [A1_1 how satisfied w/ life as a whole - Somewhat satisfied] + [A1 wtr involved in arts - 0] + [A11 wtr voted in 2010 - 0] + [A13 wtr did otr volunteer work - 0] + [B2 summer primary residence - Same as last winter] + [D8 wtr romantic relationship now - Not in romantic relationship] + [E1 employment status 1st mention - 1] + [E1 employment status 2nd mention - Inap.: no second mention] + [G19 wtr non-academic training - 0] + [G20 wtr currently in vo/tech training - NA] + [H4 wtr ever had asthma - 0] + [H8 wtr ever had high blood pressure - 0] + [H12 wtr ever had emotional/psych probs - 0] + [H14g wtr feelings more freq than usual - About the same as usual] + [H14h how much more freq than usual - NA] + [H15 wtr>2 wks depressed in past 12 mos - 0] + [H16 wtr>2 wks no interest in life - 0] + [H17 wtr had annual dr checkup last year - 0] + [H17 wtr had annual dr checkup last year - 1] + [H20b wtr covered by health insurance - Inap: r was head or wife/“wife” in the 2011 psid interview (ta110011=1 or 2)] + [H23a how often do vigorous activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H23b how often do light activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H23c how often musclebuilding activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H23a time unit for hvy phys activity–hw - Inap.: was not head or wife/“wife” in 2011 psid interview (ta110011=3); never does vigorous activities for at least 10 minutes that cause heavy sweating or large increase in breathing or heart rate (ta110893=0)] + [H29 wtr smoke cigarettes - 0] + [H36 wtr drink alcohol-head - 1] + [H40a wtr ever taken diet pills - 0] + [H40b wtr ever taken amphetamines - 0] + [H40c wtr ever taken marijuana - 1] + [H40e wtr ever taken barbiturates - 0] + [H40f wtr ever taken tranquilizers - 0] + [H50 wtr ever had sexual intercourse - 1] + [H53f diagnosed with std or hiv - Inap.: never had sexual intercourse (ta110969=5); na, dk, rf whether ever had sexual intercourse (ta110969=8 or 9); has never gone to see a doctor or nurse for std or hiv (ta110994=5); na, dk, rf whether ever gone to see a doctor or nurse for std or hiv (ta110994=8 or 9)] + [K6 wtr ever physically attacked - No] + [L1a religious preference - Protestant] + [L4 wtr spiritual person - 1] + [Marital/cohabitation status - 0] + [L7 race mention #1 - White] + [black2011 - 0] + [other2011 - 0] + [PositiveChange - NA] + [Current grade 02] + [Stayed out 02] + [Lied 02] + [Parent meeting at school 02] + [Happy 02] + [Interest in life 02] + [Satisfied 02] + [Responsibilities 02] + [Warm relationships 02] + [Challenged you 02] + [Expressing ideas 02] + [Child age at assessment - months 02] + [A8 how often watch non-news tv] + [B5a how much resonsiblty earng own livng] + [B5c how much responsblty for own bills] + [B5d how much responsiblty managing money] + [C1d how good at helping comp w/otrs] + [C2g how often feel nervous performing] + [H14a how often felt nervous in past mo] + [H14d how often felt everything effort] + [H27 # of hours of sleep in 24-hr period] + [H28a freq of snack instead of reglr meal] + [H28b frequency of binge eating] + [H30 # cigarettes per day] + [H37 how often have drinks-hd] + [K1a how often treated with less courtesy] + [K1b how often receive poorer service] + [K1c how often others treat as stupid] + [K1d how often others act afraid] + [K1e how often others treat as dishonest] + [K1f how often others act superior] + [K1k how often treated with less respect] + [K3a pct of close friends w/job not coll] + [K3c pct of close friends unemp & looking] + [K3e pct of close friends married, etc.] + [K3h pct of close friends w/kids] + [K3m pct of close friends who get drunk] + [K3n pct of close friends who use drugs] + [K11 how often did something dangerous] + [K12 how often damaged public property] + [K13 how often got into physical fight] + [K15 how often drove when drunk or high] + [Responsibilities: financial] + [Mental health: risky behaviors] + [Body weight percentile status] | [Close to stepfather 02 - Inap if q23h3d=5,8,9] |
# explicate_clusters(clusters_full)
# new_k_objective <- 3 - in case the new k-value is 1
if(new_k_objective < 2) new_k_objective <- 3
# plot the silhouette with regular kmeans call
<- plot_silhouette(df_objective_onehot, K=new_k_objective, bKPP=F) returned_list_F_objective
## [1] 11
## cluster size ave.sil.width
## 1 1 109 0.22
## 2 2 3 0.12
## 3 3 314 0.00
## 4 4 86 0.00
## 5 5 347 0.07
## 6 6 321 0.06
## 7 7 156 0.04
## 8 8 265 0.43
## 9 9 311 0.03
## 10 10 39 0.20
## 11 11 15 0.08
1]] returned_list_F_objective[[
# plot the silhouette with the kpp call
<- plot_silhouette(df_objective_onehot, K=new_k_objective, bKPP=T) returned_list_T_objective
## [1] 11
## cluster size ave.sil.width
## 1 1 77 0.10
## 2 2 13 0.10
## 3 3 268 0.52
## 4 4 304 0.09
## 5 5 55 -0.10
## 6 6 36 0.05
## 7 7 584 0.06
## 8 8 85 0.01
## 9 9 15 0.08
## 10 10 193 0.13
## 11 11 336 -0.03
1]] returned_list_T_objective[[
# if the kpp silhouette width >= kmeans width, then use the kpp algorithm
ifelse(returned_list_T_objective[[3]] >= returned_list_F_objective[[3]], bKPP_objective <- T, bKPP_objective <- F)
## [1] TRUE
# plot the tuning graph to visualize the elbow
plot_tuning(df_objective_onehot, K=k_objective_onehot, bKPP=bKPP_objective)
# return and print the 1) average silhouette width, 2) silhouettes, 3) clusters
<- plot_silhouette(df_objective_onehot, K=new_k_objective, bKPP=bKPP_objective) returned_list_objective
## [1] 11
## cluster size ave.sil.width
## 1 1 77 0.10
## 2 2 13 0.10
## 3 3 268 0.52
## 4 4 304 0.09
## 5 5 55 -0.10
## 6 6 36 0.05
## 7 7 584 0.06
## 8 8 85 0.01
## 9 9 15 0.08
## 10 10 193 0.13
## 11 11 336 -0.03
3]] returned_list_objective[[
## [1] "0.12"
1]] returned_list_objective[[
<- returned_list_objective[[2]]
clusters_objective <- matrix_centers_cleaned_up(clusters_objective$centers)
new_centers_objective # don't print the raw center data - illegible
# new_centers_objective
############################
# StrongInverseAssociation <= -2s
# InverseAssociation > -2s && <= -s
# Association >= s && < 2s
# StrongAssociation >= 2s
print_centers_summary(new_centers_objective)
Cluster | StrongInverseAssociation | InverseAssociation | Association | StrongAssociation |
---|---|---|---|---|
Cluster 1 | [Current grade 02] + [# Days ate: dairy 02] + [# Days ate: fruit 02] + [# Days ate: veges 02] + [# Days ate: grains 02] + [# Days ate: sweets 02] + [# Days ate: meat 02] + [# Days ate: other protein 02] + [# Days pe class at sch 02] + [# Min exercising at sch 02] + [# Days exercise outside sch 02] + [Global self concept 02] + [Social initiative 02] + [Child age at assessment - months 02] | [Hours sleep per night 02] + [Sexual intercourse: year 02] + [Condom use 02] + [Grade in sch] | [Sex of individual - Female] + [Sex of individual - Male] + [Self-identified race 2011 tas - White] + [Picked on you 02 - Not in the past month] + [Hit you 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to father 02 - Extremely close] + [Close to friends 02 - Quite close] + [Close to siblings 02 - Extremely close] + [Close to oth adults 02 - Fairly close] + [Aunt 02 - Yes] + [Aunt 02 - No] + [Uncle 02 - No] + [Grandparent 02 - Yes] + [Grandparent 02 - No] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Friends parent 02 - No] + [Other 02 - No] + [A1_1 how satisfied w/ life as a whole - Very satisfied] + [A1 wtr involved in arts - 0] + [A4 wtr member of sports team - 0] + [A4 wtr member of sports team - 1] + [A12 wtr involved with school clubs - 0] + [A13 wtr did otr volunteer work - 0] + [A13 wtr did otr volunteer work - 1] + [B2 summer primary residence - Same as last winter] + [D8 wtr romantic relationship now - Not in romantic relationship] + [E1 employment status 1st mention - 0] + [E1 employment status 2nd mention - Inap.: no second mention] + [H4 wtr ever had asthma - 0] + [H14g wtr feelings more freq than usual - About the same as usual] + [H14h how much more freq than usual - NA] + [H14j how much interferes with activities - Not at all] + [H16 wtr>2 wks no interest in life - 0] + [H17 wtr had annual dr checkup last year - 1] + [H20b wtr covered by health insurance - Yes] + [H23a how often do vigorous activities - Several times a week or more] + [H23b how often do light activities - Several times a week or more] + [H36 wtr drink alcohol-head - 0] + [H40c wtr ever taken marijuana - 0] + [H50 wtr ever had sexual intercourse - 0] + [H50 wtr ever had sexual intercourse - 1] + [L1a religious preference - Protestant] + [L4 wtr spiritual person - 1] + [Region - South] + [Highest education level - High school graduate plus some college] + [L7 race mention #1 - White] + [black2011 - 0] + [other2011 - 0] + [PositiveChange - Positive.Change] + [A7 how often read for pleasure] + [A10a wtr used internet for email] + [A10d wtr used internet for games] + [A10e wtr used internet for soc netwrking] + [D41 how close to father] + [D46 how close to mother] + [H27 # of hours of sleep in 24-hr period] + [H28a freq of snack instead of reglr meal] + [H28b frequency of binge eating] + [K3b2 pct of close friends in coll/grad] + [K3c pct of close friends unemp & looking] + [K3f pct of close friends in vo/tech pgm] + [K3n pct of close friends who use drugs] + [K11 how often did something dangerous] + [K12 how often damaged public property] + [L3 freq of attend relig svcs last 12 mos] + [Mental health: social anxiety] + [Mental health: risky behaviors] + [Completed education of mother] | [L6 hispanicity - No] |
Cluster 2 | [Current grade 02] | [Sexual intercourse: year 02] + [Condom use 02] + [Social initiative 02] + [Grade in sch] + [Child age at assessment - months 02] | [Sex of individual - Female] + [Self-identified race 2011 tas - Black or african american] + [L6 hispanicity - No] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Hit you 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to friends 02 - Fairly close] + [Close to siblings 02 - Extremely close] + [Close to oth adults 02 - Quite close] + [Aunt 02 - Yes] + [Uncle 02 - No] + [Grandparent 02 - Yes] + [Oth relative 02 - No] + [Friends parent 02 - No] + [Other 02 - No] + [Race/ethnicity 02 - Inap if not eligible for section j (age=8-11 yrs old)] + [Sports in 02 - No] + [School groups 02 - Yes] + [School groups 02 - No] + [Community groups 02 - Yes] + [Community groups 02 - No] + [Volunteer? 02 - No] + [Summer program 02 - Yes] + [Summer program 02 - No] + [Freq missed soc act due to hlth prob 02 - Never] + [Freq missed school due to health prob 02 - Never] + [Stay with task 02 - Sometimes] + [Orderly 02 - Sometimes] + [Do best 02 - Always] + [Finish things 02 - Sometimes] + [Do things as well as others 02 - Most of the time] + [Ever tried cigarettes 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ever tried chew tobacco 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ever drank? 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ever tried marijuana 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ever tried inhalants 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Partner 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Converse with adults 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Talk to teachers 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ask questions 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Class discussions 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Joke with teachers 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Sexual intercourse 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Relation to head 09 - Son or daughter of head (includes adopted children but not stepchildren)] + [Highest education level - NA] + [Relation to head 11 - Son or daughter of head (includes adopted children but not stepchildren)] + [H61d wtr covered by insurance now 11 - 1] + [A1_1 how satisfied w/ life as a whole - Very satisfied] + [B1 fall/winter primary residence - Parents home (house or apartment)] + [B2 summer primary residence - Same as last winter] + [D8 wtr romantic relationship now - Not in romantic relationship] + [E1 employment status 1st mention - 0] + [E1 employment status 2nd mention - Inap.: no second mention] + [H4 wtr ever had asthma - 0] + [H12 wtr ever had emotional/psych probs - 0] + [H12d wtr take nerve meds - NA] + [H14g wtr feelings more freq than usual - About the same as usual] + [H14h how much more freq than usual - NA] + [H17 wtr had annual dr checkup last year - 1] + [H20b wtr covered by health insurance - Yes] + [H23b how often do light activities - Several times a week or more] + [H36 wtr drink alcohol-head - 0] + [H40c wtr ever taken marijuana - 0] + [H50 wtr ever had sexual intercourse - 1] + [L4 wtr spiritual person - 1] + [Marital/cohabitation status - 0] + [Region - South] + [L7 race mention #1 - Black, african-american, or negro] + [black2011 - 1] + [other2011 - NA] + [PositiveChange - Positive.Change] + [# Days ate: veges 02] + [# Days ate: grains 02] + [# Days ate: sweets 02] + [# Min exercising at sch 02] + [Stayed out 02] + [No permission 02] + [A8 how often watch non-news tv] + [A10e wtr used internet for soc netwrking] + [B5a how much resonsiblty earng own livng] + [B5b how much responsiblty payng own rent] + [B5c how much responsblty for own bills] + [B5d how much responsiblty managing money] + [D41 how close to father] + [D46 how close to mother] + [H27 # of hours of sleep in 24-hr period] + [K1b how often receive poorer service] + [K3b2 pct of close friends in coll/grad] + [K3c pct of close friends unemp & looking] + [K3f pct of close friends in vo/tech pgm] + [K12 how often damaged public property] + [K13 how often got into physical fight] + [L3 freq of attend relig svcs last 12 mos] + [Responsibilities: financial] + [Mental health: worry] + [Mental health: social anxiety] + [Mental health: non-spec psych distress] + [Body weight percentile status] + [Enrollment status] + [Completed education of mother] + [Year individual born 01] + [L8 importance of ethnic group identity] | [L6 hispanicity - No] |
Cluster 3 | [Current grade 02] + [# Days ate: dairy 02] + [# Days ate: fruit 02] + [# Days ate: veges 02] + [# Days ate: grains 02] + [# Days ate: sweets 02] + [# Days ate: meat 02] + [# Days ate: other protein 02] + [# Days pe class at sch 02] + [# Min exercising at sch 02] + [# Days exercise outside sch 02] + [Global self concept 02] + [Social initiative 02] + [Grade in sch] + [Child age at assessment - months 02] + [A6 how often watched or read news] + [A7 how often read for pleasure] + [A8 how often watch non-news tv] + [A10a wtr used internet for email] + [A10b wtr used internet for school] + [A10c wtr used internet to shop] + [A10d wtr used internet for games] + [A10e wtr used internet for soc netwrking] + [B5a how much resonsiblty earng own livng] + [B5b how much responsiblty payng own rent] + [B5c how much responsblty for own bills] + [B5d how much responsiblty managing money] + [D28a number of children] + [D41 how close to father] + [D46 how close to mother] + [H27 # of hours of sleep in 24-hr period] + [H28a freq of snack instead of reglr meal] + [H28b frequency of binge eating] + [H37 how often have drinks-hd] + [K1a how often treated with less courtesy] + [K1b how often receive poorer service] + [K1c how often others treat as stupid] + [K1d how often others act afraid] + [K1e how often others treat as dishonest] + [K1f how often others act superior] + [K1k how often treated with less respect] + [K3a pct of close friends w/job not coll] + [K3b2 pct of close friends in coll/grad] + [K3c pct of close friends unemp & looking] + [K3e pct of close friends married, etc.] + [K3f pct of close friends in vo/tech pgm] + [K3h pct of close friends w/kids] + [K3m pct of close friends who get drunk] + [K3n pct of close friends who use drugs] + [K11 how often did something dangerous] + [K12 how often damaged public property] + [K13 how often got into physical fight] + [K15 how often drove when drunk or high] + [L3 freq of attend relig svcs last 12 mos] + [Responsibilities: financial] + [Mental health: worry] + [Mental health: social anxiety] + [Mental health: non-spec psych distress] + [Mental health: risky behaviors] + [Body weight percentile status] + [Completed education of mother] + [Completed education of father] + [L8 importance of ethnic group identity] | [Hours sleep per night 02] + [Sexual intercourse: year 02] + [Condom use 02] + [D11 how satisfied w/relationship] + [H30 # cigarettes per day] + [K5b age when (first) assaulted] + [Enrollment status] + [Earnings from work last year] | [Sex of individual - Female] + [Sex of individual - Male] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Picked on you 02 - Not in the past month] + [Hit you 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to siblings 02 - Extremely close] + [Uncle 02 - No] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Friends parent 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Other 02 - No] + [Relation to head 11 - Son or daughter of head (includes adopted children but not stepchildren)] + [Peer bullying 02] | [L6 hispanicity - No] |
Cluster 4 | [Current grade 02] + [Social initiative 02] | [Sexual intercourse: year 02] + [Condom use 02] + [Grade in sch] + [Child age at assessment - months 02] | [Sex of individual - Female] + [Sex of individual - Male] + [Self-identified race 2011 tas - White] + [Self-identified race 2011 tas - Black or african american] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Picked on you 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to father 02 - Extremely close] + [Close to friends 02 - Quite close] + [Close to siblings 02 - Extremely close] + [Aunt 02 - No] + [Uncle 02 - No] + [Grandparent 02 - No] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Friends parent 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Other 02 - No] + [Sports in 02 - Yes] + [Sports in 02 - No] + [School groups 02 - No] + [Community groups 02 - No] + [Volunteer? 02 - No] + [Summer program 02 - Yes] + [Summer program 02 - No] + [Freq missed soc act due to hlth prob 02 - Never] + [Freq missed school due to health prob 02 - Never] + [Stay with task 02 - Most of the time] + [Do best 02 - Always] + [Finish things 02 - Most of the time] + [Relation to head 09 - Son or daughter of head (includes adopted children but not stepchildren)] + [Highest education level - NA] + [Relation to head 11 - Son or daughter of head (includes adopted children but not stepchildren)] + [H61d wtr covered by insurance now 11 - 1] + [A1_1 how satisfied w/ life as a whole - Very satisfied] + [A1 wtr involved in arts - 0] + [A4 wtr member of sports team - 0] + [A12 wtr involved with school clubs - 0] + [A13 wtr did otr volunteer work - 0] + [B1 fall/winter primary residence - Parents home (house or apartment)] + [B2 summer primary residence - Same as last winter] + [D8 wtr romantic relationship now - Not in romantic relationship] + [E1 employment status 1st mention - 0] + [E1 employment status 1st mention - 1] + [E1 employment status 2nd mention - Inap.: no second mention] + [H1 health level - Very good] + [H4 wtr ever had asthma - 0] + [H14g wtr feelings more freq than usual - About the same as usual] + [H14h how much more freq than usual - NA] + [H14j how much interferes with activities - Not at all] + [H17 wtr had annual dr checkup last year - 1] + [H20b wtr covered by health insurance - Yes] + [H23b how often do light activities - Several times a week or more] + [H36 wtr drink alcohol-head - 0] + [H36 wtr drink alcohol-head - 1] + [H40c wtr ever taken marijuana - 0] + [H50 wtr ever had sexual intercourse - 1] + [L1a religious preference - Protestant] + [L4 wtr spiritual person - 0] + [L4 wtr spiritual person - 1] + [Region - South] + [Highest education level - High school graduate plus some college] + [L7 race mention #1 - White] + [L7 race mention #1 - Black, african-american, or negro] + [black2011 - 0] + [black2011 - 1] + [other2011 - NA] + [other2011 - 0] + [PositiveChange - Positive.Change] + [# Min exercising at sch 02] + [# Days exercise outside sch 02] + [Global self concept 02] + [A8 how often watch non-news tv] + [A10a wtr used internet for email] + [A10b wtr used internet for school] + [A10c wtr used internet to shop] + [A10e wtr used internet for soc netwrking] + [B5d how much responsiblty managing money] + [D41 how close to father] + [D46 how close to mother] + [H27 # of hours of sleep in 24-hr period] + [H28a freq of snack instead of reglr meal] + [H28b frequency of binge eating] + [K3b2 pct of close friends in coll/grad] + [K3c pct of close friends unemp & looking] + [K3f pct of close friends in vo/tech pgm] + [K3n pct of close friends who use drugs] + [K11 how often did something dangerous] + [K12 how often damaged public property] + [K13 how often got into physical fight] + [L3 freq of attend relig svcs last 12 mos] + [Mental health: social anxiety] + [Mental health: risky behaviors] + [Completed education of mother] + [Year individual born 01] + [L8 importance of ethnic group identity] | [L6 hispanicity - No] |
Cluster 5 | [Sex of individual - Female] + [Sex of individual - Male] + [Self-identified race 2011 tas - White] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Hit you 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to father 02 - Na; refused] + [Close to stepfather 02 - Inap if q23h3d=5,8,9] + [Aunt 02 - No] + [Uncle 02 - No] + [Grandparent 02 - No] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Friends parent 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Other 02 - No] + [Race/ethnicity 02 - Inap if not eligible for section j (age=8-11 yrs old)] + [Religious import 02 - Inap if (not eligible for section j (age=8-11 yrs old)) or (q23j2=95,98,99)] + [Religious comfort 02 - Inap if (not eligible for section j (age=8-11 yrs old)) or (q23j2=95,98,99)] + [Religious attend 02 - Inap if (not eligible for section j (age=8-11 yrs old)) or (q23j2=95,98,99)] + [Sports in 02 - Yes] + [School groups 02 - Yes] + [School groups 02 - No] + [Volunteer? 02 - No] + [Summer program 02 - Yes] + [Summer program 02 - No] + [Freq missed soc act due to hlth prob 02 - Never] + [Freq missed school due to health prob 02 - Never] + [Freq missed school due to health prob 02 - Just a few times] + [Do best 02 - Always] + [Do things as well as others 02 - Most of the time] + [Ever tried cigarettes 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ever tried chew tobacco 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ever tried chew tobacco 02 - No] + [Ever drank? 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [# Friends who drink 02 - None; inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ever tried marijuana 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ever tried inhalants 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ever tried inhalants 02 - No] + [Partner 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Converse with adults 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Talk to teachers 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ask questions 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Class discussions 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Joke with teachers 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Sexual intercourse 02 - Inap if not eligible for acasi section l (age=8-11 yrs old)] + [Relation to head 09 - Son or daughter of head (includes adopted children but not stepchildren)] + [Highest education level - NA] + [Relation to head 11 - Son or daughter of head (includes adopted children but not stepchildren)] + [H61d wtr covered by insurance now 11 - 1] + [Head-wife status - Ta respondent was an ofum in the 2011 psid interview] + [A1_1 how satisfied w/ life as a whole - Somewhat satisfied] + [A1 wtr involved in arts - 0] + [A13 wtr did otr volunteer work - 0] + [B1 fall/winter primary residence - Parents home (house or apartment)] + [B2 summer primary residence - Same as last winter] + [D8 wtr romantic relationship now - Not in romantic relationship] + [E1 employment status 1st mention - 0] + [E1 employment status 1st mention - 1] + [E1 employment status 2nd mention - Inap.: no second mention] + [G19 wtr non-academic training - 0] + [G20 wtr currently in vo/tech training - NA] + [H4 wtr ever had asthma - 0] + [H12 wtr ever had emotional/psych probs - 0] + [H12 wtr ever had emotional/psych probs - 1] + [H12d wtr take nerve meds - NA] + [H14g wtr feelings more freq than usual - About the same as usual] + [H14h how much more freq than usual - NA] + [H15 wtr>2 wks depressed in past 12 mos - 0] + [H15 wtr>2 wks depressed in past 12 mos - 1] + [H16 wtr>2 wks no interest in life - NA] + [H17 wtr had annual dr checkup last year - 1] + [H20b wtr covered by health insurance - Yes] + [H23a time unit for hvy phys activity–hw - Inap.: was not head or wife/“wife” in 2011 psid interview (ta110011=3); never does vigorous activities for at least 10 minutes that cause heavy sweating or large increase in breathing or heart rate (ta110893=0)] + [H29 wtr smoke cigarettes - 0] + [H29 wtr smoke cigarettes - 1] + [H36 wtr drink alcohol-head - 1] + [H40a wtr ever taken diet pills - 0] + [H40b wtr ever taken amphetamines - 0] + [H40b wtr ever taken amphetamines - 1] + [H40c wtr ever taken marijuana - 1] + [H40e wtr ever taken barbiturates - 0] + [H40f wtr ever taken tranquilizers - 0] + [H53f diagnosed with std or hiv - Inap.: never had sexual intercourse (ta110969=5); na, dk, rf whether ever had sexual intercourse (ta110969=8 or 9); has never gone to see a doctor or nurse for std or hiv (ta110994=5); na, dk, rf whether ever gone to see a doctor or nurse for std or hiv (ta110994=8 or 9)] + [K4 wtr ever sexually assaulted/raped - No] + [K5a # times sexually assaulted - Inap.: never been sexually assaulted or raped (ta111021=5); na, dk, rf whether ever been sexually assaulted or raped (ta111021=8 or 9)] + [K6 wtr ever physically attacked - Yes] + [L1a religious preference - Protestant] + [L4 wtr spiritual person - 0] + [L4 wtr spiritual person - 1] + [Region - South] + [L7 race mention #1 - White] + [black2011 - 0] + [other2011 - 0] + [PositiveChange - Positive.Change] + [PositiveChange - NA] + [# Days ate: dairy 02] + [# Days ate: grains 02] + [# Days pe class at sch 02] + [# Min exercising at sch 02] + [# Days exercise outside sch 02] + [Peer bullying 02] + [A8 how often watch non-news tv] + [A10d wtr used internet for games] + [A10e wtr used internet for soc netwrking] + [B5a how much resonsiblty earng own livng] + [B5b how much responsiblty payng own rent] + [B5c how much responsblty for own bills] + [B5d how much responsiblty managing money] + [H28a freq of snack instead of reglr meal] + [H28b frequency of binge eating] + [H51e # of sexual intercourse partners] + [K3a pct of close friends w/job not coll] + [K3c pct of close friends unemp & looking] + [K3e pct of close friends married, etc.] + [K3f pct of close friends in vo/tech pgm] + [K3h pct of close friends w/kids] + [Responsibilities: financial] + [Mental health: social anxiety] + [Body weight percentile status] + [Completed education of mother] | [L6 hispanicity - No] | ||
Cluster 6 | [Current grade 02] + [# Days ate: dairy 02] + [# Days ate: fruit 02] + [# Days ate: veges 02] + [# Days ate: grains 02] + [# Days ate: sweets 02] + [# Days ate: meat 02] + [# Days ate: other protein 02] + [# Days pe class at sch 02] + [# Min exercising at sch 02] + [# Days exercise outside sch 02] + [Global self concept 02] + [Social initiative 02] + [Child age at assessment - months 02] | [Hours sleep per night 02] + [Sexual intercourse: year 02] + [Condom use 02] + [Grade in sch] + [Earnings from work last year] | [Sex of individual - Male] + [L6 hispanicity - No] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Hit you 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to father 02 - Extremely close] + [Close to friends 02 - Fairly close] + [Close to siblings 02 - Extremely close] + [Relation to head 11 - Son or daughter of head (includes adopted children but not stepchildren)] + [H61d wtr covered by insurance now 11 - 1] + [A1_1 how satisfied w/ life as a whole - Somewhat satisfied] + [A1 wtr involved in arts - 0] + [A4 wtr member of sports team - 0] + [A12 wtr involved with school clubs - 0] + [A13 wtr did otr volunteer work - 0] + [B2 summer primary residence - Same as last winter] + [D8 wtr romantic relationship now - Not in romantic relationship] + [E1 employment status 1st mention - 0] + [E1 employment status 2nd mention - Inap.: no second mention] + [H4 wtr ever had asthma - 0] + [H14g wtr feelings more freq than usual - About the same as usual] + [H14h how much more freq than usual - NA] + [H15 wtr>2 wks depressed in past 12 mos - 0] + [H16 wtr>2 wks no interest in life - 0] + [H17 wtr had annual dr checkup last year - 0] + [H17 wtr had annual dr checkup last year - 1] + [H20b wtr covered by health insurance - Yes] + [H36 wtr drink alcohol-head - 0] + [H40c wtr ever taken marijuana - 0] + [H50 wtr ever had sexual intercourse - 1] + [L1a religious preference - Protestant] + [L4 wtr spiritual person - 0] + [L4 wtr spiritual person - 1] + [Region - South] + [Highest education level - High school graduate plus some college] + [L7 race mention #1 - Black, african-american, or negro] + [L7 race mention #2 - NA] + [black2011 - 1] + [other2011 - NA] + [PositiveChange - Positive.Change] + [PositiveChange - NA] + [Peer bullying 02] + [A8 how often watch non-news tv] + [A10b wtr used internet for school] + [A10d wtr used internet for games] + [A10e wtr used internet for soc netwrking] + [B5d how much responsiblty managing money] + [D41 how close to father] + [D46 how close to mother] + [H27 # of hours of sleep in 24-hr period] + [H28a freq of snack instead of reglr meal] + [H28b frequency of binge eating] + [K1a how often treated with less courtesy] + [K1b how often receive poorer service] + [K1c how often others treat as stupid] + [K1d how often others act afraid] + [K1e how often others treat as dishonest] + [K1f how often others act superior] + [K1k how often treated with less respect] + [K3b2 pct of close friends in coll/grad] + [K3c pct of close friends unemp & looking] + [K3f pct of close friends in vo/tech pgm] + [K3n pct of close friends who use drugs] + [K11 how often did something dangerous] + [K12 how often damaged public property] + [K13 how often got into physical fight] + [L3 freq of attend relig svcs last 12 mos] + [Mental health: worry] + [Mental health: social anxiety] + [Mental health: non-spec psych distress] + [Mental health: risky behaviors] + [Body weight percentile status] + [Completed education of mother] + [Completed education of father] + [L8 importance of ethnic group identity] | [L6 hispanicity - No] |
Cluster 7 | [Condom use 02] + [Year individual born 01] | [Sex of individual - Female] + [Sex of individual - Male] + [Self-identified race 2011 tas - White] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Picked on you 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to teachers 02 - Fairly close] + [Aunt 02 - No] + [Uncle 02 - No] + [Grandparent 02 - No] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Friends parent 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Other 02 - No] + [Race/ethnicity 02 - White] + [Spiritual? 02 - Inap if (not eligible for section j (age=8-11 yrs old)) or (q23j2=01-20,97)] + [Sports in 02 - Yes] + [School groups 02 - Yes] + [School groups 02 - No] + [Community groups 02 - No] + [Volunteer? 02 - Yes] + [Volunteer? 02 - No] + [Summer program 02 - Yes] + [Summer program 02 - No] + [Freq missed soc act due to hlth prob 02 - Never] + [Freq missed school due to health prob 02 - Never] + [Stay with task 02 - Most of the time] + [Do best 02 - Always] + [Finish things 02 - Most of the time] + [Do things as well as others 02 - Most of the time] + [Ever tried cigarettes 02 - No] + [Ever drank? 02 - No] + [# Friends who drink 02 - None; inap if not eligible for acasi section l (age=8-11 yrs old)] + [Partner 02 - No] + [Relation to head 09 - Son or daughter of head (includes adopted children but not stepchildren)] + [Highest education level - High school graduate plus some college] + [Relation to head 11 - Son or daughter of head (includes adopted children but not stepchildren)] + [H61d wtr covered by insurance now 11 - 1] + [Head-wife status - Ta respondent was an ofum in the 2011 psid interview] + [A1_1 how satisfied w/ life as a whole - Very satisfied] + [A4 wtr member of sports team - 0] + [A11 wtr voted in 2010 - 0] + [A12 wtr involved with school clubs - 0] + [A13 wtr did otr volunteer work - 0] + [B1 fall/winter primary residence - Apartment or room that r rented] + [B2 summer primary residence - Same as last winter] + [D8 wtr romantic relationship now - Not in romantic relationship] + [E1 employment status 1st mention - 1] + [E1 employment status 2nd mention - Inap.: no second mention] + [H1 health level - Very good] + [H4 wtr ever had asthma - 0] + [H14g wtr feelings more freq than usual - About the same as usual] + [H14h how much more freq than usual - NA] + [H14j how much interferes with activities - Not at all] + [H17 wtr had annual dr checkup last year - 1] + [H20b wtr covered by health insurance - Inap: r was head or wife/“wife” in the 2011 psid interview (ta110011=1 or 2)] + [H23a how often do vigorous activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H23b how often do light activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H23c how often musclebuilding activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H23a time unit for hvy phys activity–hw - Inap.: was not head or wife/“wife” in 2011 psid interview (ta110011=3); never does vigorous activities for at least 10 minutes that cause heavy sweating or large increase in breathing or heart rate (ta110893=0)] + [H36 wtr drink alcohol-head - 1] + [H40a wtr ever taken diet pills - 0] + [H40c wtr ever taken marijuana - 0] + [H40c wtr ever taken marijuana - 1] + [L1a religious preference - Protestant] + [L4 wtr spiritual person - 1] + [Marital/cohabitation status - 0] + [Highest education level - Skipped, asked in ta-09] + [L7 race mention #1 - White] + [black2011 - 0] + [other2011 - 0] + [PositiveChange - Positive.Change] + [Current grade 02] + [# Days ate: dairy 02] + [# Days ate: grains 02] + [# Days ate: meat 02] + [Global self concept 02] + [Social initiative 02] + [Child age at assessment - months 02] + [A6 how often watched or read news] + [A7 how often read for pleasure] + [A8 how often watch non-news tv] + [A10a wtr used internet for email] + [A10b wtr used internet for school] + [A10c wtr used internet to shop] + [A10e wtr used internet for soc netwrking] + [B5a how much resonsiblty earng own livng] + [B5b how much responsiblty payng own rent] + [B5c how much responsblty for own bills] + [B5d how much responsiblty managing money] + [D41 how close to father] + [D46 how close to mother] + [H27 # of hours of sleep in 24-hr period] + [H28a freq of snack instead of reglr meal] + [H37 how often have drinks-hd] + [K1a how often treated with less courtesy] + [K1b how often receive poorer service] + [K1k how often treated with less respect] + [K3a pct of close friends w/job not coll] + [K3b2 pct of close friends in coll/grad] + [K3e pct of close friends married, etc.] + [K3m pct of close friends who get drunk] + [K12 how often damaged public property] + [Responsibilities: financial] + [Mental health: worry] + [Mental health: social anxiety] + [Mental health: risky behaviors] + [Body weight percentile status] + [Completed education of mother] + [Completed education of father] | [L6 hispanicity - No] | |
Cluster 8 | [Sex of individual - Male] + [Self-identified race 2011 tas - Black or african american] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Relation to head 01 - Son or daughter of head (includes adopted children but not stepchildren)] + [Picked on you 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to father 02 - Na; refused] + [Close to stepfather 02 - Inap if q23h3d=5,8,9] + [Close to stepmother 02 - Inap if q23h3c=5,8,9] + [Close to siblings 02 - Extremely close] + [Aunt 02 - No] + [Uncle 02 - No] + [Grandparent 02 - No] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Friends parent 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Other 02 - No] + [Race/ethnicity 02 - African american] + [Spiritual? 02 - Inap if (not eligible for section j (age=8-11 yrs old)) or (q23j2=01-20,97)] + [Sports in 02 - Yes] + [Sports in 02 - No] + [School groups 02 - No] + [Volunteer? 02 - No] + [Summer program 02 - No] + [Freq missed soc act due to hlth prob 02 - Never] + [Freq missed soc act due to hlth prob 02 - Just a few times] + [Freq missed school due to health prob 02 - Never] + [Stay with task 02 - Sometimes] + [Do best 02 - Always] + [Ever tried cigarettes 02 - No] + [Ever drank? 02 - No] + [# Friends who drink 02 - None; inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ever tried marijuana 02 - No] + [Partner 02 - Yes] + [Partner 02 - No] + [Talk to teachers 02 - Never] + [Sexual intercourse 02 - No] + [Relation to head 09 - Son or daughter of head (includes adopted children but not stepchildren)] + [Highest education level - High school graduate, no college] + [Relation to head 11 - Son or daughter of head (includes adopted children but not stepchildren)] + [H61d wtr covered by insurance now 11 - 1] + [A11 wtr voted in 2010 - 0] + [A13 wtr did otr volunteer work - 0] + [B1 fall/winter primary residence - Parents home (house or apartment)] + [B2 summer primary residence - Same as last winter] + [D8 wtr romantic relationship now - Not in romantic relationship] + [E1 employment status 1st mention - 1] + [G19 wtr non-academic training - 0] + [G20 wtr currently in vo/tech training - NA] + [H4 wtr ever had asthma - 0] + [H14g wtr feelings more freq than usual - About the same as usual] + [H14h how much more freq than usual - NA] + [H16 wtr>2 wks no interest in life - 0] + [H17 wtr had annual dr checkup last year - 0] + [H17 wtr had annual dr checkup last year - 1] + [H20b wtr covered by health insurance - No] + [H29 wtr smoke cigarettes - 0] + [H36 wtr drink alcohol-head - 0] + [H36 wtr drink alcohol-head - 1] + [H40c wtr ever taken marijuana - 0] + [H40c wtr ever taken marijuana - 1] + [H53f diagnosed with std or hiv - Inap.: never had sexual intercourse (ta110969=5); na, dk, rf whether ever had sexual intercourse (ta110969=8 or 9); has never gone to see a doctor or nurse for std or hiv (ta110994=5); na, dk, rf whether ever gone to see a doctor or nurse for std or hiv (ta110994=8 or 9)] + [L1a religious preference - Protestant] + [L4 wtr spiritual person - 0] + [L4 wtr spiritual person - 1] + [Marital/cohabitation status - 0] + [Region - South] + [L7 race mention #1 - Black, african-american, or negro] + [black2011 - 1] + [other2011 - NA] + [PositiveChange - Positive.Change] + [Current grade 02] + [# Days ate: sweets 02] + [A6 how often watched or read news] + [A7 how often read for pleasure] + [A8 how often watch non-news tv] + [A10c wtr used internet to shop] + [A10d wtr used internet for games] + [B5a how much resonsiblty earng own livng] + [B5b how much responsiblty payng own rent] + [B5c how much responsblty for own bills] + [B5d how much responsiblty managing money] + [D28a number of children] + [D46 how close to mother] + [H27 # of hours of sleep in 24-hr period] + [H28a freq of snack instead of reglr meal] + [H28b frequency of binge eating] + [H30 # cigarettes per day] + [K1c how often others treat as stupid] + [K1d how often others act afraid] + [K1e how often others treat as dishonest] + [K1f how often others act superior] + [K1k how often treated with less respect] + [K3c pct of close friends unemp & looking] + [K3e pct of close friends married, etc.] + [K3f pct of close friends in vo/tech pgm] + [K3m pct of close friends who get drunk] + [K3n pct of close friends who use drugs] + [K12 how often damaged public property] + [K13 how often got into physical fight] + [Responsibilities: financial] + [Mental health: worry] + [Mental health: social anxiety] + [Mental health: risky behaviors] + [Body weight percentile status] + [Completed education of mother] + [L8 importance of ethnic group identity] | [L6 hispanicity - No] | ||
Cluster 9 | [H37 how often have drinks-hd] + [Year individual born 01] | [Sex of individual - Male] + [Self-identified race 2011 tas - Black or african american] + [L6 hispanicity - No] + [Picked on you 02 - Not in the past month] + [Hit you 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to father 02 - Na; refused] + [Close to stepfather 02 - Inap if q23h3d=5,8,9] + [Close to friends 02 - Quite close] + [Close to siblings 02 - Extremely close] + [Close to teachers 02 - Fairly close] + [Aunt 02 - No] + [Uncle 02 - No] + [Grandparent 02 - No] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Friends parent 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Race/ethnicity 02 - African american] + [Spiritual? 02 - Inap if (not eligible for section j (age=8-11 yrs old)) or (q23j2=01-20,97)] + [Sports in 02 - Yes] + [Sports in 02 - No] + [Community groups 02 - No] + [Volunteer? 02 - No] + [Summer program 02 - No] + [Freq missed soc act due to hlth prob 02 - Never] + [Orderly 02 - Sometimes] + [Do best 02 - Always] + [Ever tried cigarettes 02 - No] + [Ever drank? 02 - No] + [# Friends who drink 02 - None; inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ever tried marijuana 02 - No] + [Partner 02 - Yes] + [Partner 02 - No] + [Sexual intercourse 02 - No] + [Relation to head 09 - Head in 2009; 2007 head who was mover-out nonresponse by the time of the 2009 interview] + [H60 wtr fu member w/hlth ins last 2 yrs - Yes, one or more persons covered] + [H61d wtr covered by insurance now 11 - 1] + [Result of cds/ta iw attempt 11 - Interview with eligible sample individual] + [A1 wtr involved in arts - 0] + [A4 wtr member of sports team - 0] + [A9 wtr ever used internet - 1] + [A11 wtr voted in 2010 - 0] + [A11b wtr in social action groups - 0] + [A12 wtr involved with school clubs - 0] + [A13 wtr did otr volunteer work - 0] + [B2 summer primary residence - Same as last winter] + [E1 employment status 1st mention - 0] + [E1 employment status 2nd mention - Inap.: no second mention] + [E1 employment status 3rd mention - Inap.: fewer than three mentions] + [E71a ever in armed forces - 0] + [G19 wtr non-academic training - 0] + [H4 wtr ever had asthma - 0] + [H8 wtr ever had high blood pressure - 0] + [H12 wtr ever had emotional/psych probs - 0] + [H14g wtr feelings more freq than usual - About the same as usual] + [H14h how much more freq than usual - NA] + [H15 wtr>2 wks depressed in past 12 mos - 0] + [H16 wtr>2 wks no interest in life - 0] + [H17 wtr had annual dr checkup last year - 1] + [H20b wtr covered by health insurance - Inap: r was head or wife/“wife” in the 2011 psid interview (ta110011=1 or 2)] + [H23a how often do vigorous activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H23b how often do light activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H23c how often musclebuilding activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H29 wtr smoke cigarettes - 0] + [H36 wtr drink alcohol-head - 0] + [H40a wtr ever taken diet pills - 0] + [H40b wtr ever taken amphetamines - 0] + [H40c wtr ever taken marijuana - 0] + [H40e wtr ever taken barbiturates - 0] + [H40f wtr ever taken tranquilizers - 0] + [H40g wtr ever taken steroids - 0] + [H50 wtr ever had sexual intercourse - 1] + [H53f diagnosed with std or hiv - Inap.: never had sexual intercourse (ta110969=5); na, dk, rf whether ever had sexual intercourse (ta110969=8 or 9); has never gone to see a doctor or nurse for std or hiv (ta110994=5); na, dk, rf whether ever gone to see a doctor or nurse for std or hiv (ta110994=8 or 9)] + [K4 wtr ever sexually assaulted/raped - No] + [K5a # times sexually assaulted - Inap.: never been sexually assaulted or raped (ta111021=5); na, dk, rf whether ever been sexually assaulted or raped (ta111021=8 or 9)] + [K6 wtr ever physically attacked - No] + [L1a religious preference - Protestant] + [L4 wtr spiritual person - 1] + [Marital/cohabitation status - 0] + [L7 race mention #1 - Black, african-american, or negro] + [black2011 - 1] + [other2011 - NA] + [PositiveChange - NA] + [Current grade 02] + [# Days ate: meat 02] + [Sexual intercourse: month 02] + [Sexual intercourse: year 02] + [Global self concept 02] + [Social initiative 02] + [H28b frequency of binge eating] | [L6 hispanicity - No] | |
Cluster 10 | [A6 how often watched or read news] + [A7 how often read for pleasure] + [A8 how often watch non-news tv] + [A10a wtr used internet for email] + [A10b wtr used internet for school] + [A10c wtr used internet to shop] + [A10d wtr used internet for games] + [A10e wtr used internet for soc netwrking] + [B5a how much resonsiblty earng own livng] + [B5b how much responsiblty payng own rent] + [B5c how much responsblty for own bills] + [B5d how much responsiblty managing money] + [D28a number of children] + [D41 how close to father] + [D46 how close to mother] + [H27 # of hours of sleep in 24-hr period] + [H28a freq of snack instead of reglr meal] + [H28b frequency of binge eating] + [H37 how often have drinks-hd] + [K1a how often treated with less courtesy] + [K1b how often receive poorer service] + [K1c how often others treat as stupid] + [K1d how often others act afraid] + [K1e how often others treat as dishonest] + [K1f how often others act superior] + [K1k how often treated with less respect] + [K3a pct of close friends w/job not coll] + [K3b2 pct of close friends in coll/grad] + [K3c pct of close friends unemp & looking] + [K3e pct of close friends married, etc.] + [K3f pct of close friends in vo/tech pgm] + [K3h pct of close friends w/kids] + [K3m pct of close friends who get drunk] + [K3n pct of close friends who use drugs] + [K11 how often did something dangerous] + [K12 how often damaged public property] + [K13 how often got into physical fight] + [K15 how often drove when drunk or high] + [L3 freq of attend relig svcs last 12 mos] + [Responsibilities: financial] + [Mental health: worry] + [Mental health: social anxiety] + [Mental health: non-spec psych distress] + [Mental health: risky behaviors] + [Body weight percentile status] + [Completed education of mother] + [Completed education of father] + [L8 importance of ethnic group identity] | [D11 how satisfied w/relationship] + [H30 # cigarettes per day] + [K5b age when (first) assaulted] + [Enrollment status] + [Earnings from work last year] + [Year individual born 01] | [Sex of individual - Female] + [Sex of individual - Male] + [Relation to head 01 - Son or daughter of head (includes adopted children but not stepchildren)] + [Picked on you 02 - Not in the past month] + [Left out of things 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to friends 02 - Quite close] + [Aunt 02 - No] + [Uncle 02 - No] + [Grandparent 02 - No] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Friends parent 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Other 02 - No] + [Sports in 02 - Yes] + [Sports in 02 - No] + [School groups 02 - No] + [Volunteer? 02 - No] + [Summer program 02 - No] + [Freq missed soc act due to hlth prob 02 - Never] + [Freq missed school due to health prob 02 - Never] + [Stay with task 02 - Most of the time] + [Do best 02 - Always] + [Finish things 02 - Most of the time] + [Do things as well as others 02 - Most of the time] + [Ever tried cigarettes 02 - No] + [Ever tried chew tobacco 02 - No] + [Ever drank? 02 - Yes] + [# Friends who drink 02 - None; inap if not eligible for acasi section l (age=8-11 yrs old)] + [Ever tried marijuana 02 - No] + [Ever tried inhalants 02 - No] + [Partner 02 - Yes] + [Sexual intercourse 02 - No] + [Relation to head 09 - Son or daughter of head (includes adopted children but not stepchildren)] + [Highest education level - NA] + [H60 wtr fu member w/hlth ins last 2 yrs - Yes, one or more persons covered] + [H61d wtr covered by insurance now 11 - NA] + [Current grade 02] + [Global self concept 02] + [Child age at assessment - months 02] | [L6 hispanicity - No] |
Cluster 11 | [Year individual born 01] | [Sex of individual - Female] + [Sex of individual - Male] + [Self-identified race 2011 tas - Black or african american] + [Whether sample or nonsample - This individual is born-in sample (er30002=030-169)] + [Relation to head 01 - Son or daughter of head (includes adopted children but not stepchildren)] + [Picked on you 02 - Not in the past month] + [Close to mother 02 - Extremely close] + [Close to father 02 - Na; refused] + [Close to stepfather 02 - Inap if q23h3d=5,8,9] + [Close to stepmother 02 - Inap if q23h3c=5,8,9] + [Close to siblings 02 - Extremely close] + [Close to oth adults 02 - Fairly close] + [Aunt 02 - No] + [Uncle 02 - No] + [Grandparent 02 - No] + [Oth relative 02 - No] + [Neighbor 02 - No] + [Coworker 02 - No] + [Friends parent 02 - No] + [Activity leader 02 - No] + [Mentor 02 - No] + [Other 02 - No] + [Race/ethnicity 02 - African american] + [Religious import 02 - Very important] + [Spiritual? 02 - Inap if (not eligible for section j (age=8-11 yrs old)) or (q23j2=01-20,97)] + [Sports in 02 - Yes] + [Sports in 02 - No] + [School groups 02 - Yes] + [School groups 02 - No] + [Community groups 02 - No] + [Volunteer? 02 - No] + [Summer program 02 - No] + [Freq missed soc act due to hlth prob 02 - Never] + [Freq missed school due to health prob 02 - Never] + [Stay with task 02 - Most of the time] + [Do best 02 - Always] + [Finish things 02 - Most of the time] + [Do things as well as others 02 - Most of the time] + [Ever tried cigarettes 02 - Yes] + [Ever drank? 02 - Yes] + [Ever tried marijuana 02 - Yes] + [Ever tried marijuana 02 - No] + [Partner 02 - Yes] + [Relation to head 09 - Head in 2009; 2007 head who was mover-out nonresponse by the time of the 2009 interview] + [H60 wtr fu member w/hlth ins last 2 yrs - Yes, one or more persons covered] + [Relation to head 11 - Head in 2011; 2009 head who was mover-out nonresponse by the time of the 2011 interview] + [H61d wtr covered by insurance now 11 - 1] + [Head-wife status - Ta respondent was head in the 2011 psid interview] + [A11 wtr voted in 2010 - 0] + [B1 fall/winter primary residence - Apartment or room that r rented] + [B2 summer primary residence - Same as last winter] + [D8 wtr romantic relationship now - Married or cohabitating] + [E1 employment status 1st mention - 1] + [E1 employment status 2nd mention - Inap.: no second mention] + [G19 wtr non-academic training - 0] + [G20 wtr currently in vo/tech training - NA] + [H4 wtr ever had asthma - 0] + [H14g wtr feelings more freq than usual - About the same as usual] + [H14h how much more freq than usual - NA] + [H14j how much interferes with activities - Not at all] + [H16 wtr>2 wks no interest in life - 0] + [H17 wtr had annual dr checkup last year - 1] + [H20b wtr covered by health insurance - Inap: r was head or wife/“wife” in the 2011 psid interview (ta110011=1 or 2)] + [H23a how often do vigorous activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H23b how often do light activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H23c how often musclebuilding activities - Inap.: respondent was head or wife/“wife” in 2011 psid interview (ta110011=1 or 2)] + [H23a time unit for hvy phys activity–hw - Inap.: was not head or wife/“wife” in 2011 psid interview (ta110011=3); never does vigorous activities for at least 10 minutes that cause heavy sweating or large increase in breathing or heart rate (ta110893=0)] + [H29 wtr smoke cigarettes - 0] + [H36 wtr drink alcohol-head - 1] + [H40a wtr ever taken diet pills - 0] + [H40c wtr ever taken marijuana - 1] + [H53f diagnosed with std or hiv - Inap.: never had sexual intercourse (ta110969=5); na, dk, rf whether ever had sexual intercourse (ta110969=8 or 9); has never gone to see a doctor or nurse for std or hiv (ta110994=5); na, dk, rf whether ever gone to see a doctor or nurse for std or hiv (ta110994=8 or 9)] + [L1a religious preference - Protestant] + [L4 wtr spiritual person - 1] + [Marital/cohabitation status - 0] + [Marital/cohabitation status - 1] + [Region - South] + [L7 race mention #1 - Black, african-american, or negro] + [black2011 - 1] + [other2011 - NA] + [PositiveChange - Positive.Change] + [# Days ate: grains 02] + [# Days ate: sweets 02] + [# Days ate: meat 02] + [Stayed out 02] + [Sexual intercourse: month 02] + [Global self concept 02] + [Social initiative 02] + [Body mass index 02] + [Grade in sch] + [A6 how often watched or read news] + [A7 how often read for pleasure] + [A8 how often watch non-news tv] + [A10a wtr used internet for email] + [B5a how much resonsiblty earng own livng] + [B5b how much responsiblty payng own rent] + [B5c how much responsblty for own bills] + [B5d how much responsiblty managing money] + [D11 how satisfied w/relationship] + [H27 # of hours of sleep in 24-hr period] + [H28a freq of snack instead of reglr meal] + [H30 # cigarettes per day] + [H37 how often have drinks-hd] + [K1a how often treated with less courtesy] + [K1b how often receive poorer service] + [K1c how often others treat as stupid] + [K1d how often others act afraid] + [K1e how often others treat as dishonest] + [K1f how often others act superior] + [K1k how often treated with less respect] + [K3a pct of close friends w/job not coll] + [K3c pct of close friends unemp & looking] + [K3e pct of close friends married, etc.] + [K3f pct of close friends in vo/tech pgm] + [K3m pct of close friends who get drunk] + [K3n pct of close friends who use drugs] + [K12 how often damaged public property] + [K13 how often got into physical fight] + [K15 how often drove when drunk or high] + [Responsibilities: financial] + [Mental health: worry] + [Mental health: risky behaviors] + [Body weight percentile status] + [Earnings from work last year] + [L8 importance of ethnic group identity] | [L6 hispanicity - No] |
# explicate_clusters(clusters_objective)
There are numerous features, in the various buckets and are difficult to parse. This could be the start of further inquiry. Because the dataset is one-hot encoded, there is a possibility where one feature with multiple values may have different statistical significance, which adds complexity to the analysis. Perhaps this can be cross referenced with the feature selection output?