Opinion towards household labor division

602 (Spring 2024)

Author

Jingyi Yang, Connor Woodsmall

Project Description

Here we will be investigating how the sex of the primary caregiver shapes people’s opinions about the family. We believe that there will be preferences and differences between the respondents based on a variety of variables including region, race, and income status.

As the workforce continues to see an increase in the number of employed mothers, the standard role of each parent has shifted dramatically. This experiment aims to discover the preferences of a large variety of people’s opinions concerning differing breakdowns of family labor division. Utilizing a between-subject experiment design, one of three stories, each with a different familial labor divide, are presented to a randomly selected group of respondents. After reading the story, each respondent will answer a selection of questions related to their thoughts on the family. Demographic questions are collected as well to provide for deeper analysis.

# data import, cleaning, and recoding including IV
library(tidyverse)
── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
✔ dplyr     1.1.4     ✔ readr     2.1.5
✔ forcats   1.0.0     ✔ stringr   1.5.1
✔ ggplot2   3.5.1     ✔ tibble    3.2.1
✔ lubridate 1.9.3     ✔ tidyr     1.3.1
✔ purrr     1.0.2     
── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
✖ dplyr::filter() masks stats::filter()
✖ dplyr::lag()    masks stats::lag()
ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
# let's use our own data from a pilot test I ran 
# for your report, you should replace this data with the actual one!
projectdata <- read_csv("~/大四下/2-Research Design DACSS 602/Final Project/RD_Omnibus_SP24final_May+10,+2024_09.34.csv")
Rows: 140 Columns: 220
── Column specification ────────────────────────────────────────────────────────
Delimiter: ","
chr (220): StartDate, EndDate, Status, IPAddress, Progress, Duration (in sec...

ℹ Use `spec()` to retrieve the full column specification for this data.
ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
View(projectdata) # example data

head(projectdata)
# A tibble: 6 × 220
  StartDate    EndDate Status IPAddress Progress Duration (in seconds…¹ Finished
  <chr>        <chr>   <chr>  <chr>     <chr>    <chr>                  <chr>   
1 "Start Date" "End D… "Resp… "IP Addr… "Progre… "Duration (in seconds… "Finish…
2 "{\"ImportI… "{\"Im… "{\"I… "{\"Impo… "{\"Imp… "{\"ImportId\":\"dura… "{\"Imp…
3 "2024-05-08… "2024-… "IP A… "68.104.… "100"    "965"                  "True"  
4 "2024-05-08… "2024-… "IP A… "172.56.… "100"    "321"                  "True"  
5 "2024-05-08… "2024-… "IP A… "138.88.… "100"    "18"                   "True"  
6 "2024-05-08… "2024-… "IP A… "73.176.… "100"    "143"                  "True"  
# ℹ abbreviated name: ¹​`Duration (in seconds)`
# ℹ 213 more variables: RecordedDate <chr>, ResponseId <chr>,
#   RecipientLastName <chr>, RecipientFirstName <chr>, RecipientEmail <chr>,
#   ExternalReference <chr>, LocationLatitude <chr>, LocationLongitude <chr>,
#   DistributionChannel <chr>, UserLanguage <chr>, Q_RecaptchaScore <chr>,
#   Q_RelevantIDDuplicate <chr>, Q_RelevantIDDuplicateScore <chr>,
#   Q_RelevantIDFraudScore <chr>, Q_RelevantIDLastStartDate <chr>, …
# subseting demographic questions for all groups
demos <- projectdata %>%
  filter(Status != "Survey Preview") %>%
  select(rid, age, gender, hhi, ethnicity, hispanic,
         education, political_party, region, zip) 
# codebook is available in Canvas
dim(demos)
[1] 140  10
# Group 1 as an example
g4 <- projectdata %>%
  filter(Status != "Survey Preview") %>% # remove previews
  select(starts_with(c("g4EQ","g4_")), rid) %>%
  full_join(demos) %>% # we want to keep all variables
  filter(!row_number() %in% c(1, 2)) # drop the first two rows
Joining with `by = join_by(rid)`
Warning in full_join(., demos): Detected an unexpected many-to-many relationship between `x` and `y`.
ℹ Row 94 of `x` matches multiple rows in `y`.
ℹ Row 94 of `y` matches multiple rows in `x`.
ℹ If a many-to-many relationship is expected, set `relationship =
  "many-to-many"` to silence this warning.
head(g4)
# A tibble: 6 × 27
  `g4EQ1 `           g4EQ2 g4EQ3 g4EQ4 g4EQ5 g4EQ6 g4EQ7 g4_DO_g4EQ3 g4_DO_g4EQ4
  <chr>              <chr> <chr> <chr> <chr> <chr> <chr> <chr>       <chr>      
1 Strongly agree     Stro… Stro… Some… Some… Some… Some… 4           5          
2 Somewhat agree     Neit… Neit… Neit… Some… Some… Neit… 4           5          
3 <NA>               <NA>  <NA>  <NA>  <NA>  <NA>  <NA>  <NA>        <NA>       
4 Somewhat disagree  Some… Neit… Some… Stro… Neit… Some… 4           5          
5 Somewhat agree     Some… Some… Some… Some… Some… Some… 4           5          
6 Neither agree nor… Some… Stro… Stro… Stro… Stro… Stro… 4           5          
# ℹ 18 more variables: g4_DO_g4EQ5 <chr>, g4_DO_g4EQ6 <chr>, g4_DO_g4s2 <chr>,
#   g4_DO_g4s3 <chr>, `g4_DO_g4EQ1 ` <chr>, g4_DO_g4EQ2 <chr>,
#   g4_DO_g4s1 <chr>, g4_DO_g4EQ7 <chr>, rid <chr>, age <chr>, gender <chr>,
#   hhi <chr>, ethnicity <chr>, hispanic <chr>, education <chr>,
#   political_party <chr>, region <chr>, zip <chr>
# IV
# focus on g1_DO (Display Order: g#_DO) to find 
# which treatment R received.
# Group 1's treatments are placed in the last part of the string, 
# g1q3, g1q4, g1q5, g1q6
# what we'd like to do is to create a new variable 
# that has four levels
# for the four treatments
# to use the str_detect() function, let's use stringr() package

library(stringr)

g4_clean<- g4 %>% 
  mutate(treatment = case_when(
    str_detect(g4_DO_g4s1, "1") ~ 1,
    str_detect(g4_DO_g4s2, "1") ~ 2,
    str_detect(g4_DO_g4s3, "1") ~ 3 )) 

#Clean the data and rename the collum

library(dplyr)

g4_final<- g4_clean%>% select(-contains("g4_DO"))%>%
  rename("financial_support"= `g4EQ1 `, "career_development"="g4EQ2", "enough_time"= "g4EQ3", "arguments"="g4EQ4", "independent_child"="g4EQ5", "relax"= "g4EQ6", "reasonable"="g4EQ7")%>% na.omit()

view(g4_final)

head(g4_final)
# A tibble: 6 × 18
  financial_support   career_development enough_time arguments independent_child
  <chr>               <chr>              <chr>       <chr>     <chr>            
1 Strongly agree      Strongly agree     Strongly a… Somewhat… Somewhat agree   
2 Somewhat agree      Neither agree nor… Neither ag… Neither … Somewhat agree   
3 Somewhat disagree   Somewhat disagree  Neither ag… Somewhat… Strongly disagree
4 Somewhat agree      Somewhat agree     Somewhat a… Somewhat… Somewhat agree   
5 Neither agree nor … Somewhat agree     Strongly a… Strongly… Strongly agree   
6 Somewhat disagree   Somewhat disagree  Somewhat a… Somewhat… Neither agree no…
# ℹ 13 more variables: relax <chr>, reasonable <chr>, rid <chr>, age <chr>,
#   gender <chr>, hhi <chr>, ethnicity <chr>, hispanic <chr>, education <chr>,
#   political_party <chr>, region <chr>, zip <chr>, treatment <dbl>
# Here, I recoded our dependent variable questions to fit the Likert scale, allowing us to perform analytics on the respondents. 
projectdata_recoded <- g4_final %>%
  mutate(financial_support_num = case_when(financial_support == "Strongly disagree" ~ 1,
                                       financial_support == "Somewhat disagree" ~ 2,
                                       financial_support == "Neither agree nor disagree" ~ 3,
                                       financial_support == "Somewhat agree" ~ 4,
                                       financial_support == "Strongly agree" ~ 5),
         career_development_num = case_when(career_development == "Strongly disagree" ~ 1,
                                        career_development == "Somewhat disagree" ~ 2,
                                        career_development == "Neither agree nor disagree" ~ 3,
                                        career_development == "Somewhat agree" ~ 4,
                                        career_development == "Strongly agree" ~ 5),
         enough_time_num = case_when(enough_time == "Strongly disagree" ~ 1,
                                 enough_time == "Somewhat disagree" ~ 2,
                                 enough_time == "Neither agree nor disagree" ~ 3,
                                 enough_time == "Somewhat agree" ~ 4,
                                 enough_time == "Strongly agree" ~ 5),
         arguments_num = case_when(arguments == "Strongly disagree" ~ 1,
                               arguments == "Somewhat disagree" ~ 2,
                               arguments == "Neither agree nor disagree" ~ 3,
                               arguments == "Somewhat agree" ~ 4,
                               arguments == "Strongly agree" ~ 5),
         independent_child_num = case_when(independent_child == "Strongly disagree" ~ 1,
                                       independent_child == "Somewhat disagree" ~ 2,
                                       independent_child == "Neither agree nor disagree" ~ 3,
                                       independent_child == "Somewhat agree" ~ 4,
                                       independent_child == "Strongly agree" ~ 5),
         relax_num = case_when(relax == "Strongly disagree" ~ 1,
                           relax == "Somewhat disagree" ~ 2,
                           relax == "Neither agree nor disagree" ~ 3,
                           relax == "Somewhat agree" ~ 4,
                           relax == "Strongly agree" ~ 5),
         reasonable_num = case_when(reasonable == "Strongly disagree" ~ 1,
                                reasonable == "Somewhat disagree" ~ 2,
                                reasonable == "Neither agree nor disagree" ~ 3,
                                reasonable == "Somewhat agree" ~ 4,
                                reasonable == "Strongly agree" ~ 5))

#Here, I recoded our demographic questions to fit the categorical variable, allowing us to perform analytics on the respondents.

projectdata_recoded$gender<- recode(projectdata_recoded$gender, "1"="Male", "2"= "Female")

projectdata_recoded$education<- recode(projectdata_recoded$education, "1"= "Some high school or less", "2"= "High school graduate", "3"= "Other post high school vocational training", "4"= "Completed some college, but no degree", "5"= "Associate's degree", "6"= "Bachelor's degree", "7"= "Master's or professional degree", "8"= "Doctorate degree","-3105"= "None of the above")

projectdata_recoded$ethnicity <- recode(projectdata_recoded$ethnicity, "1"= "White", "2"=   "Black, or African American", "3"= "American Indian or Alaska Native", "4"  = "Asian *** Asian Indian", "5"=    "Asian *** Chinese", "6" = "Asian *** Filipino", "7"= "Asian *** Japanese",  "8"=   "Asian *** Korean",  "9"    = "Asian *** Vietnamese", "10"= "Asian *** Other", "11"="Pacific Islander *** Native Hawaiian", "12"= "Pacific Islander *** Guamanian", "13"=   "Pacific Islander *** Samoan", "14"=    "Pacific Islander *** Other Pacific Islander", "15"=    "Some other race",  "16"=   "Prefer not to answer" )

projectdata_recoded$hispanic <- recode(projectdata_recoded$hispanic,"1"=    "No , not of Hispanic, Latino, or Spanish origin", "2"= "Yes, Mexican, Mexican American, Chicano", "3"= "Yes, Cuban", "4"   = "Yes, another Hispanic, Latino, or Spanish origin *** Argentina",  "5"=   "Yes, another Hispanic, Latino, or Spanish origin *** Colombia",  "6"=  "Yes, another Hispanic, Latino, or Spanish origin *** Ecuador",  "7"=   "Yes, another Hispanic, Latino, or Spanish origin *** El Salvadore", "8"=   "Yes, another Hispanic, Latino, or Spanish origin *** Guatemala",  "9"= "Yes, another Hispanic, Latino, or Spanish origin *** Nicaragua",  "10" = "Yes, another Hispanic, Latino, or Spanish origin *** Panama",  "11"= "Yes, another Hispanic, Latino, or Spanish origin *** Peru", "12"=  "Yes, another Hispanic, Latino, or Spanish origin *** Spain",  "13"=    "Yes, another Hispanic, Latino, or Spanish origin *** Venezuela", "14"= "Yes, another Hispanic, Latino, or Spanish origin *** Other Country", "15"= "Prefer not to answer")


projectdata_recoded$hhi <- recode(projectdata_recoded$hhi, "1"= "Less than $14,999", "2"=   "$15,000 to $19,999", "3"= "$20,000 to $24,999", "4"=   "$25,000 to $29,999", "5"   = "$30,000 to $34,999", "6" = "$35,000 to $39,999", "7"= "$40,000 to $44,999", "8"= "$45,000 to $49,999", "9"= "$50,000 to $54,999", "10"= "$55,000 to $59,999", "11"= "$60,000 to $64,999", "12"= "$65,000 to $69,999", "13"=  "$70,000 to $74,999", "14"= "$75,000 to $79,999", "15"=     "$80,000 to $84,999", "16"= "$85,000 to $89,999", "17"= "$90,000 to $94,999", "18"= "$95,000 to $99,999", "19"= "$100,000 to $124,999", "20"=   "$125,000 to $149,999", "21"=   "$150,000 to $174,999", "22"=   "$175,000 to $199,999", "23"= "$200,000 to $249,999", "24"= "$250,000 and above", "-3105"=  "Prefer not to answer")

projectdata_recoded$political_party <- recode(projectdata_recoded$political_party, "1"= "Strong Democrat", "2"= "Not very strong Democrat", "3"= "Independent Democrat", "4"=   "Independent - neither", 
"5"= "Independent Republican", "6"= "Other - leaning Democrat", "7"=    "Other - neither", "8"= "Other - leaning Republican", "9"=  "Not very strong Republican", "10"= "Strong Republican")

projectdata_recoded$region <- recode(projectdata_recoded$region, "1"=   "Northeast", "2"=   "Midwest", "3"= "South", "4" = "West")

Descriptive Summary

# Frequency Table for demographics of population
table(projectdata_recoded$gender)

Female   Male 
   128      1 
table(projectdata_recoded$education)

                        Associate's degree 
                                        15 
                         Bachelor's degree 
                                        23 
     Completed some college, but no degree 
                                        27 
                          Doctorate degree 
                                         4 
                      High school graduate 
                                        30 
           Master's or professional degree 
                                        13 
                         None of the above 
                                         2 
Other post high school vocational training 
                                        10 
                  Some high school or less 
                                         5 
table(projectdata_recoded$ethnicity)

American Indian or Alaska Native           Asian *** Asian Indian 
                               2                                1 
               Asian *** Chinese       Black, or African American 
                               1                               15 
     Pacific Islander *** Samoan             Prefer not to answer 
                               1                                1 
                 Some other race                            White 
                               7                              101 
table(projectdata_recoded$hispanic)

                   No , not of Hispanic, Latino, or Spanish origin 
                                                               119 
    Yes, another Hispanic, Latino, or Spanish origin *** Argentina 
                                                                 1 
Yes, another Hispanic, Latino, or Spanish origin *** Other Country 
                                                                 1 
    Yes, another Hispanic, Latino, or Spanish origin *** Venezuela 
                                                                 1 
                           Yes, Mexican, Mexican American, Chicano 
                                                                 7 
table(projectdata_recoded$hhi)

$100,000 to $124,999 $125,000 to $149,999   $15,000 to $19,999 
                   3                    1                   18 
$150,000 to $174,999 $175,000 to $199,999   $20,000 to $24,999 
                   5                    3                    9 
$200,000 to $249,999   $25,000 to $29,999   $30,000 to $34,999 
                   5                    6                    6 
  $35,000 to $39,999   $40,000 to $44,999   $45,000 to $49,999 
                   6                    7                    6 
  $50,000 to $54,999   $55,000 to $59,999   $60,000 to $64,999 
                   9                    4                    2 
  $65,000 to $69,999   $70,000 to $74,999   $75,000 to $79,999 
                   6                    3                    4 
  $80,000 to $84,999   $85,000 to $89,999   $90,000 to $94,999 
                   2                    4                    1 
  $95,000 to $99,999                   25    Less than $14,999 
                   1                    1                   17 
table(projectdata_recoded$political_party)

     Independent - neither       Independent Democrat 
                        11                          9 
    Independent Republican   Not very strong Democrat 
                        14                         14 
Not very strong Republican   Other - leaning Democrat 
                        17                          2 
Other - leaning Republican            Other - neither 
                         1                          7 
           Strong Democrat          Strong Republican 
                        30                         24 
table(projectdata_recoded$region)

  Midwest Northeast     South      West 
       26        23        42        38 
projectdata_recoded %>% group_by(treatment)%>% select(`gender`)%>% table()
Adding missing grouping variables: `treatment`
         gender
treatment Female Male
        1     44    1
        2     41    0
        3     43    0
projectdata_recoded %>% group_by(treatment)%>% select(`education`)%>% table()
Adding missing grouping variables: `treatment`
         education
treatment Associate's degree Bachelor's degree
        1                  4                 7
        2                  4                11
        3                  7                 5
         education
treatment Completed some college, but no degree Doctorate degree
        1                                    10                2
        2                                    10                0
        3                                     7                2
         education
treatment High school graduate Master's or professional degree
        1                   11                               4
        2                    6                               4
        3                   13                               5
         education
treatment None of the above Other post high school vocational training
        1                 0                                          4
        2                 2                                          3
        3                 0                                          3
         education
treatment Some high school or less
        1                        3
        2                        1
        3                        1
projectdata_recoded %>% group_by(treatment)%>% select(`ethnicity`)%>% table()
Adding missing grouping variables: `treatment`
         ethnicity
treatment American Indian or Alaska Native Asian *** Asian Indian
        1                                0                      0
        2                                1                      1
        3                                1                      0
         ethnicity
treatment Asian *** Chinese Black, or African American
        1                 1                          4
        2                 0                          6
        3                 0                          5
         ethnicity
treatment Pacific Islander *** Samoan Prefer not to answer Some other race
        1                           0                    0               0
        2                           0                    1               2
        3                           1                    0               5
         ethnicity
treatment White
        1    40
        2    30
        3    31
projectdata_recoded %>% group_by(treatment)%>% select(`hispanic`)%>% table()
Adding missing grouping variables: `treatment`
         hispanic
treatment No , not of Hispanic, Latino, or Spanish origin
        1                                              45
        2                                              37
        3                                              37
         hispanic
treatment Yes, another Hispanic, Latino, or Spanish origin *** Argentina
        1                                                              0
        2                                                              1
        3                                                              0
         hispanic
treatment Yes, another Hispanic, Latino, or Spanish origin *** Other Country
        1                                                                  0
        2                                                                  0
        3                                                                  1
         hispanic
treatment Yes, another Hispanic, Latino, or Spanish origin *** Venezuela
        1                                                              0
        2                                                              0
        3                                                              1
         hispanic
treatment Yes, Mexican, Mexican American, Chicano
        1                                       0
        2                                       3
        3                                       4
projectdata_recoded %>% group_by(treatment)%>% select(`hhi`)%>% table()
Adding missing grouping variables: `treatment`
         hhi
treatment $100,000 to $124,999 $125,000 to $149,999 $15,000 to $19,999
        1                    1                    0                  5
        2                    0                    1                  5
        3                    2                    0                  8
         hhi
treatment $150,000 to $174,999 $175,000 to $199,999 $20,000 to $24,999
        1                    2                    2                  4
        2                    3                    1                  1
        3                    0                    0                  4
         hhi
treatment $200,000 to $249,999 $25,000 to $29,999 $30,000 to $34,999
        1                    2                  4                  3
        2                    1                  1                  1
        3                    2                  1                  2
         hhi
treatment $35,000 to $39,999 $40,000 to $44,999 $45,000 to $49,999
        1                  5                  2                  2
        2                  1                  0                  3
        3                  0                  5                  1
         hhi
treatment $50,000 to $54,999 $55,000 to $59,999 $60,000 to $64,999
        1                  3                  0                  0
        2                  3                  3                  1
        3                  3                  1                  1
         hhi
treatment $65,000 to $69,999 $70,000 to $74,999 $75,000 to $79,999
        1                  1                  1                  1
        2                  2                  1                  3
        3                  3                  1                  0
         hhi
treatment $80,000 to $84,999 $85,000 to $89,999 $90,000 to $94,999
        1                  0                  2                  0
        2                  1                  2                  1
        3                  1                  0                  0
         hhi
treatment $95,000 to $99,999 25 Less than $14,999
        1                  0  0                 5
        2                  0  1                 5
        3                  1  0                 7
projectdata_recoded %>% group_by(treatment)%>% select(`political_party`)%>% table()
Adding missing grouping variables: `treatment`
         political_party
treatment Independent - neither Independent Democrat Independent Republican
        1                     4                    4                      3
        2                     1                    1                      8
        3                     6                    4                      3
         political_party
treatment Not very strong Democrat Not very strong Republican
        1                        3                          6
        2                        8                          6
        3                        3                          5
         political_party
treatment Other - leaning Democrat Other - leaning Republican Other - neither
        1                        0                          0               4
        2                        2                          0               2
        3                        0                          1               1
         political_party
treatment Strong Democrat Strong Republican
        1              11                10
        2               8                 5
        3              11                 9
projectdata_recoded %>% group_by(treatment)%>% select(`region`)%>% table()
Adding missing grouping variables: `treatment`
         region
treatment Midwest Northeast South West
        1      12         5    15   13
        2      10        11    12    8
        3       4         7    15   17
#Frequency table for likert scale
table(projectdata_recoded$financial_support)

Neither agree nor disagree             Somewhat agree 
                        38                         54 
         Somewhat disagree             Strongly agree 
                         7                         28 
         Strongly disagree 
                         2 
table(projectdata_recoded$career_development)

Neither agree nor disagree             Somewhat agree 
                        44                         49 
         Somewhat disagree             Strongly agree 
                        11                         22 
         Strongly disagree 
                         3 
table(projectdata_recoded$enough_time)

Neither agree nor disagree             Somewhat agree 
                        46                         46 
         Somewhat disagree             Strongly agree 
                        13                         20 
         Strongly disagree 
                         4 
table(projectdata_recoded$arguments)

Neither agree nor disagree             Somewhat agree 
                        54                         30 
         Somewhat disagree             Strongly agree 
                        26                          8 
         Strongly disagree 
                        11 
table(projectdata_recoded$independent_child)

Neither agree nor disagree             Somewhat agree 
                        54                         48 
         Somewhat disagree             Strongly agree 
                         3                         22 
         Strongly disagree 
                         2 
table(projectdata_recoded$relax)

Neither agree nor disagree             Somewhat agree 
                        61                         35 
         Somewhat disagree             Strongly agree 
                        17                         14 
         Strongly disagree 
                         2 
table(projectdata_recoded$reasonable)

Neither agree nor disagree             Somewhat agree 
                        39                         42 
         Somewhat disagree             Strongly agree 
                        21                         21 
         Strongly disagree 
                         6 
projectdata_recoded %>% group_by(treatment)%>% select(`financial_support`)%>% table()
Adding missing grouping variables: `treatment`
         financial_support
treatment Neither agree nor disagree Somewhat agree Somewhat disagree
        1                         18             15                 3
        2                         11             19                 4
        3                          9             20                 0
         financial_support
treatment Strongly agree Strongly disagree
        1              8                 1
        2              7                 0
        3             13                 1
projectdata_recoded %>% group_by(treatment)%>% select(`career_development`)%>% table()
Adding missing grouping variables: `treatment`
         career_development
treatment Neither agree nor disagree Somewhat agree Somewhat disagree
        1                         15             15                 6
        2                         17             16                 3
        3                         12             18                 2
         career_development
treatment Strongly agree Strongly disagree
        1              7                 2
        2              4                 1
        3             11                 0
projectdata_recoded %>% group_by(treatment)%>% select(`enough_time`)%>% table()
Adding missing grouping variables: `treatment`
         enough_time
treatment Neither agree nor disagree Somewhat agree Somewhat disagree
        1                         14             18                 5
        2                         18             14                 5
        3                         14             14                 3
         enough_time
treatment Strongly agree Strongly disagree
        1              5                 3
        2              4                 0
        3             11                 1
projectdata_recoded %>% group_by(treatment)%>% select(`arguments`)%>% table()
Adding missing grouping variables: `treatment`
         arguments
treatment Neither agree nor disagree Somewhat agree Somewhat disagree
        1                         17             13                 8
        2                         16             12                 9
        3                         21              5                 9
         arguments
treatment Strongly agree Strongly disagree
        1              3                 4
        2              3                 1
        3              2                 6
projectdata_recoded %>% group_by(treatment)%>% select(`independent_child`)%>% table()
Adding missing grouping variables: `treatment`
         independent_child
treatment Neither agree nor disagree Somewhat agree Somewhat disagree
        1                         23             16                 2
        2                         18             14                 1
        3                         13             18                 0
         independent_child
treatment Strongly agree Strongly disagree
        1              4                 0
        2              7                 1
        3             11                 1
projectdata_recoded %>% group_by(treatment)%>% select(`relax`)%>% table()
Adding missing grouping variables: `treatment`
         relax
treatment Neither agree nor disagree Somewhat agree Somewhat disagree
        1                         23              7                10
        2                         20             13                 4
        3                         18             15                 3
         relax
treatment Strongly agree Strongly disagree
        1              4                 1
        2              4                 0
        3              6                 1
projectdata_recoded %>% group_by(treatment)%>% select(`reasonable`)%>% table()
Adding missing grouping variables: `treatment`
         reasonable
treatment Neither agree nor disagree Somewhat agree Somewhat disagree
        1                         16              6                14
        2                         13             18                 6
        3                         10             18                 1
         reasonable
treatment Strongly agree Strongly disagree
        1              5                 4
        2              2                 2
        3             14                 0
# Numerical Summary for likert scale

projectdata_recoded_num <- projectdata_recoded %>% select(contains("num"), treatment)

projectdata_recoded_num_financial_sum<- projectdata_recoded_num %>% group_by(treatment)%>%
summarise(median_number = median(financial_support_num ,na.rm = T), mean_number = mean(financial_support_num, na.rm = T), sd_number = sd(financial_support_num,na.rm = T), max = max(financial_support_num, na.rm=TRUE), min = min(financial_support_num, na.rm=TRUE)) %>% mutate (range= max-min)

projectdata_recoded_num_career_sum<- projectdata_recoded_num %>% group_by(treatment)%>%
summarise(median_number = median(career_development_num,na.rm = T), mean_number = mean(career_development_num, na.rm = T), sd_number = sd(career_development_num,na.rm = T), max = max(career_development_num, na.rm=TRUE), min = min(career_development_num, na.rm=TRUE)) %>% mutate (range= max-min)

projectdata_recoded_num_career_sum<- projectdata_recoded_num %>% group_by(treatment)%>%
summarise(median_number = median(career_development_num,na.rm = T), mean_number = mean(career_development_num, na.rm = T), sd_number = sd(career_development_num,na.rm = T), max = max(career_development_num, na.rm=TRUE), min = min(career_development_num, na.rm=TRUE)) %>% mutate (range= max-min)

projectdata_recoded_num_enough_sum<- projectdata_recoded_num %>% group_by(treatment)%>%
summarise(median_number = median(enough_time_num ,na.rm = T), mean_number = mean(enough_time_num, na.rm = T), sd_number = sd(enough_time_num,na.rm = TRUE), max = max(enough_time_num, na.rm=TRUE), min = min(enough_time_num, na.rm=TRUE)) %>% mutate (range= max-min)

projectdata_recoded_num_arguments_sum<- projectdata_recoded_num %>% group_by(treatment)%>%
summarise(median_number = median(arguments_num ,na.rm = T), mean_number = mean(arguments_num, na.rm = T), sd_number = sd(arguments_num,na.rm = TRUE), max = max(arguments_num, na.rm=TRUE), min = min(arguments_num, na.rm=TRUE)) %>% mutate (range= max-min)

projectdata_recoded_num_independent_sum<- projectdata_recoded_num %>% group_by(treatment)%>%
summarise(median_number = median(independent_child_num, na.rm = T), mean_number = mean(independent_child_num, na.rm = T), sd_number = sd(independent_child_num,na.rm = TRUE), max = max(independent_child_num, na.rm=TRUE), min = min(independent_child_num, na.rm=TRUE)) %>% mutate (range= max-min)

projectdata_recoded_num_relax_sum<- projectdata_recoded_num %>% group_by(treatment)%>%
summarise(median_number = median(relax_num, na.rm = T), mean_number = mean(relax_num, na.rm = T), sd_number = sd(relax_num,na.rm = TRUE), max = max(relax_num, na.rm=TRUE), min = min(relax_num, na.rm=TRUE)) %>% mutate (range= max-min)

projectdata_recoded_num_reasonable_sum<- projectdata_recoded_num %>% group_by(treatment)%>%
summarise(median_number = median(reasonable_num, na.rm = T), mean_number = mean(reasonable_num, na.rm = T), sd_number = sd(reasonable_num,na.rm = TRUE), max = max(reasonable_num, na.rm=TRUE), min = min(reasonable_num, na.rm=TRUE)) %>% mutate (range= max-min)

#Numerical Summary for age 
projectdata_recoded_age_sum<- projectdata_recoded %>% mutate (age= as.numeric(age)) %>% group_by(treatment)%>%
summarise(median_number = median(age, na.rm = T), mean_number = mean(age, na.rm = T), sd_number = sd(age,na.rm = TRUE), max = max(age, na.rm=TRUE), min = min(age, na.rm=TRUE)) %>% mutate (range= max-min)

Findings

# Household Income and education level
data.aov_1_1 <- aov(financial_support_num ~ hhi*education, data = projectdata_recoded )
summary(data.aov_1_1)
              Df Sum Sq Mean Sq F value Pr(>F)
hhi           23  25.12  1.0923   1.223  0.265
education      8   3.56  0.4446   0.498  0.853
hhi:education 40  25.42  0.6355   0.711  0.871
Residuals     57  50.93  0.8934               
data.aov_1_2 <- aov(career_development_num ~ hhi*education, data = projectdata_recoded )
summary(data.aov_1_2)
              Df Sum Sq Mean Sq F value Pr(>F)  
hhi           23  28.96  1.2591   1.653 0.0636 .
education      8   6.32  0.7904   1.038 0.4191  
hhi:education 40  36.53  0.9133   1.199 0.2611  
Residuals     57  43.41  0.7615                 
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
data.aov_1_3 <- aov(enough_time_num ~ hhi*education, data = projectdata_recoded )
summary(data.aov_1_3)
              Df Sum Sq Mean Sq F value Pr(>F)
hhi           23  21.34  0.9278   0.935  0.556
education      8   5.97  0.7461   0.752  0.646
hhi:education 40  38.39  0.9597   0.967  0.538
Residuals     57  56.55  0.9921               
data.aov_1_4 <- aov(arguments_num ~ hhi*education, data = projectdata_recoded )
summary(data.aov_1_4)
              Df Sum Sq Mean Sq F value Pr(>F)
hhi           23  18.42  0.8008   0.659  0.864
education      8   4.33  0.5412   0.445  0.888
hhi:education 40  39.96  0.9991   0.822  0.741
Residuals     57  69.26  1.2151               
data.aov_1_5 <- aov(independent_child_num ~ hhi*education, data = projectdata_recoded )
summary(data.aov_1_5)
              Df Sum Sq Mean Sq F value Pr(>F)
hhi           23  18.27  0.7941   1.165  0.312
education      8   9.40  1.1748   1.724  0.113
hhi:education 40  24.49  0.6122   0.898  0.636
Residuals     57  38.84  0.6814               
data.aov_1_6 <- aov(relax_num ~ hhi*education, data = projectdata_recoded )
summary(data.aov_1_6)
              Df Sum Sq Mean Sq F value Pr(>F)
hhi           23  14.84  0.6451   0.790  0.728
education      8   6.56  0.8198   1.004  0.443
hhi:education 40  34.40  0.8599   1.053  0.423
Residuals     57  46.53  0.8164               
data.aov_1_7 <- aov(reasonable_num ~ hhi*education, data = projectdata_recoded )
summary(data.aov_1_7)
              Df Sum Sq Mean Sq F value Pr(>F)
hhi           23  25.39  1.1037   0.922  0.572
education      8   7.10  0.8871   0.741  0.655
hhi:education 40  50.10  1.2524   1.046  0.432
Residuals     57  68.26  1.1975               
# Education Level

data.aov_2_1 <- aov(financial_support_num ~ education *education, data = projectdata_recoded )
summary(data.aov_2_1)
             Df Sum Sq Mean Sq F value Pr(>F)
education     8   6.58  0.8220   1.002  0.438
Residuals   120  98.45  0.8204               
data.aov_2_2 <- aov(career_development_num ~ education, data = projectdata_recoded )
summary(data.aov_2_2)
             Df Sum Sq Mean Sq F value Pr(>F)
education     8   7.13  0.8910   0.989  0.448
Residuals   120 108.10  0.9008               
data.aov_2_3 <- aov(enough_time_num ~ education, data = projectdata_recoded )
summary(data.aov_2_3)
             Df Sum Sq Mean Sq F value Pr(>F)
education     8  10.65   1.331   1.432   0.19
Residuals   120 111.60   0.930               
data.aov_2_4 <- aov(arguments_num ~ education, data = projectdata_recoded )
summary(data.aov_2_4)
             Df Sum Sq Mean Sq F value Pr(>F)
education     8   2.63  0.3287   0.305  0.963
Residuals   120 129.34  1.0778               
data.aov_2_5 <- aov(independent_child_num ~ education, data = projectdata_recoded )
summary(data.aov_2_5)
             Df Sum Sq Mean Sq F value Pr(>F)  
education     8   9.46  1.1820    1.74  0.096 .
Residuals   120  81.54  0.6795                 
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
data.aov_2_6 <- aov(relax_num ~ education, data = projectdata_recoded )
summary(data.aov_2_6)
             Df Sum Sq Mean Sq F value Pr(>F)
education     8   7.34  0.9178    1.16  0.329
Residuals   120  94.98  0.7915               
data.aov_2_7 <- aov(reasonable_num ~ education, data = projectdata_recoded )
summary(data.aov_2_7)
             Df Sum Sq Mean Sq F value Pr(>F)
education     8   8.05   1.006   0.845  0.565
Residuals   120 142.79   1.190               
# Household Income

data.aov_3_1 <- aov(financial_support_num ~ hhi, data = projectdata_recoded )
summary(data.aov_3_1)
             Df Sum Sq Mean Sq F value Pr(>F)
hhi          23  25.12  1.0923   1.435  0.112
Residuals   105  79.90  0.7609               
data.aov_3_2 <- aov(career_development_num ~ hhi, data = projectdata_recoded)
summary(data.aov_3_2)
             Df Sum Sq Mean Sq F value Pr(>F)  
hhi          23  28.96  1.2591   1.533 0.0759 .
Residuals   105  86.26  0.8216                 
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
data.aov_3_3 <- aov(enough_time_num ~ hhi, data = projectdata_recoded )
summary(data.aov_3_3)
             Df Sum Sq Mean Sq F value Pr(>F)
hhi          23  21.34  0.9278   0.965  0.515
Residuals   105 100.91  0.9610               
data.aov_3_4 <- aov(arguments_num ~ hhi, data = projectdata_recoded )
summary(data.aov_3_4)
             Df Sum Sq Mean Sq F value Pr(>F)
hhi          23  18.42  0.8008    0.74  0.794
Residuals   105 113.55  1.0814               
data.aov_3_5 <- aov(independent_child_num ~ hhi, data = projectdata_recoded )
summary(data.aov_3_5)
             Df Sum Sq Mean Sq F value Pr(>F)
hhi          23  18.27  0.7941   1.147  0.311
Residuals   105  72.73  0.6926               
data.aov_3_6 <- aov(relax_num ~ hhi, data = projectdata_recoded )
summary(data.aov_3_6)
             Df Sum Sq Mean Sq F value Pr(>F)
hhi          23  14.84  0.6451   0.774  0.755
Residuals   105  87.49  0.8332               
data.aov_3_7 <- aov(reasonable_num ~ hhi, data = projectdata_recoded )
summary(data.aov_3_7)
             Df Sum Sq Mean Sq F value Pr(>F)
hhi          23  25.39   1.104   0.924  0.568
Residuals   105 125.45   1.195               
# Ethnicity

data.aov_4_1 <- aov(financial_support_num ~ ethnicity, data = projectdata_recoded )
summary(data.aov_4_1)
             Df Sum Sq Mean Sq F value Pr(>F)
ethnicity     7   8.97  1.2815   1.614  0.138
Residuals   121  96.05  0.7938               
data.aov_4_2 <- aov(career_development_num ~ ethnicity, data = projectdata_recoded)
summary(data.aov_4_2)
             Df Sum Sq Mean Sq F value Pr(>F)
ethnicity     7  10.48  1.4977    1.73  0.108
Residuals   121 104.74  0.8656               
data.aov_4_3 <- aov(enough_time_num ~ ethnicity, data = projectdata_recoded )
summary(data.aov_4_3)
             Df Sum Sq Mean Sq F value Pr(>F)
ethnicity     7    5.4  0.7711   0.799   0.59
Residuals   121  116.8  0.9657               
data.aov_4_4 <- aov(arguments_num ~ ethnicity, data = projectdata_recoded )
summary(data.aov_4_4)
             Df Sum Sq Mean Sq F value Pr(>F)
ethnicity     7   4.97  0.7094   0.676  0.692
Residuals   121 127.00  1.0496               
data.aov_4_5 <- aov(independent_child_num ~ ethnicity, data = projectdata_recoded )
summary(data.aov_4_5)
             Df Sum Sq Mean Sq F value Pr(>F)  
ethnicity     7  11.19  1.5982   2.423 0.0234 *
Residuals   121  79.80  0.6595                 
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
data.aov_4_6 <- aov(relax_num ~ ethnicity, data = projectdata_recoded )
summary(data.aov_4_6)
             Df Sum Sq Mean Sq F value Pr(>F)
ethnicity     7   6.07  0.8678   1.091  0.373
Residuals   121  96.25  0.7955               
data.aov_4_7 <- aov(reasonable_num ~ ethnicity, data = projectdata_recoded )
summary(data.aov_4_7)
             Df Sum Sq Mean Sq F value Pr(>F)
ethnicity     7   9.91   1.416   1.216  0.299
Residuals   121 140.92   1.165               
# Hispanic, Latino, or Spanish Origin

data.aov_5_1 <- aov(financial_support_num ~ hispanic, data = projectdata_recoded )
summary(data.aov_5_1)
             Df Sum Sq Mean Sq F value Pr(>F)
hispanic      4   5.09  1.2726   1.579  0.184
Residuals   124  99.93  0.8059               
data.aov_5_2 <- aov(career_development_num ~ hispanic, data = projectdata_recoded)
summary(data.aov_5_2)
             Df Sum Sq Mean Sq F value Pr(>F)  
hispanic      4   6.97   1.743   1.997 0.0991 .
Residuals   124 108.25   0.873                 
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
data.aov_5_3 <- aov(enough_time_num ~ hispanic, data = projectdata_recoded )
summary(data.aov_5_3)
             Df Sum Sq Mean Sq F value Pr(>F)
hispanic      4    2.8  0.7007   0.727  0.575
Residuals   124  119.5  0.9633               
data.aov_5_4 <- aov(arguments_num ~ hispanic, data = projectdata_recoded )
summary(data.aov_5_4)
             Df Sum Sq Mean Sq F value Pr(>F)
hispanic      4   7.33   1.833   1.823  0.129
Residuals   124 124.64   1.005               
data.aov_5_5 <- aov(independent_child_num ~ hispanic, data = projectdata_recoded )
summary(data.aov_5_5)
             Df Sum Sq Mean Sq F value  Pr(>F)   
hispanic      4   9.82  2.4539   3.748 0.00649 **
Residuals   124  81.18  0.6546                   
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
data.aov_5_6 <- aov(relax_num ~ hispanic, data = projectdata_recoded )
summary(data.aov_5_6)
             Df Sum Sq Mean Sq F value Pr(>F)
hispanic      4   4.61   1.153   1.463  0.218
Residuals   124  97.71   0.788               
data.aov_5_7 <- aov(reasonable_num ~ hispanic, data = projectdata_recoded )
summary(data.aov_5_7)
             Df Sum Sq Mean Sq F value Pr(>F)
hispanic      4   3.39   0.848   0.713  0.584
Residuals   124 147.45   1.189               
# Republican, a Democrat, an Independent

data.aov_6_1 <- aov(financial_support_num ~ political_party, data = projectdata_recoded )
summary(data.aov_6_1)
                 Df Sum Sq Mean Sq F value Pr(>F)
political_party   9   7.84  0.8710   1.067  0.393
Residuals       119  97.18  0.8167               
data.aov_6_2 <- aov(career_development_num ~ political_party, data = projectdata_recoded)
summary(data.aov_6_2)
                 Df Sum Sq Mean Sq F value Pr(>F)
political_party   9  12.67  1.4076   1.633  0.113
Residuals       119 102.56  0.8618               
data.aov_6_3 <- aov(enough_time_num ~ political_party, data = projectdata_recoded )
summary(data.aov_6_3)
                 Df Sum Sq Mean Sq F value Pr(>F)  
political_party   9  14.45  1.6057   1.773 0.0804 .
Residuals       119 107.80  0.9059                 
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
data.aov_6_4 <- aov(arguments_num ~ political_party, data = projectdata_recoded )
summary(data.aov_6_4)
                 Df Sum Sq Mean Sq F value Pr(>F)
political_party   9   5.34  0.5938   0.558  0.829
Residuals       119 126.62  1.0641               
data.aov_6_5 <- aov(independent_child_num ~ political_party, data = projectdata_recoded )
summary(data.aov_6_5)
                 Df Sum Sq Mean Sq F value Pr(>F)  
political_party   9  10.42  1.1572   1.709 0.0942 .
Residuals       119  80.58  0.6771                 
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
data.aov_6_6 <- aov(relax_num ~ political_party, data = projectdata_recoded )
summary(data.aov_6_6)
                 Df Sum Sq Mean Sq F value Pr(>F)
political_party   9   1.93  0.2142   0.254  0.985
Residuals       119 100.40  0.8437               
data.aov_6_7 <- aov(reasonable_num ~ political_party, data = projectdata_recoded )
summary(data.aov_6_7)
                 Df Sum Sq Mean Sq F value Pr(>F)
political_party   9   9.47   1.052   0.886   0.54
Residuals       119 141.37   1.188               
# Region

data.aov_7_1 <- aov(financial_support_num ~ region, data = projectdata_recoded )
summary(data.aov_7_1)
             Df Sum Sq Mean Sq F value Pr(>F)  
region        3   8.55  2.8515   3.695 0.0137 *
Residuals   125  96.47  0.7718                 
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
data.aov_7_2 <- aov(career_development_num ~ region, data = projectdata_recoded)
summary(data.aov_7_2)
             Df Sum Sq Mean Sq F value Pr(>F)  
region        3   7.17  2.3910   2.766 0.0447 *
Residuals   125 108.05  0.8644                 
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
data.aov_7_3 <- aov(enough_time_num ~ region, data = projectdata_recoded )
summary(data.aov_7_3)
             Df Sum Sq Mean Sq F value Pr(>F)
region        3   1.26  0.4207   0.435  0.729
Residuals   125 120.99  0.9679               
data.aov_7_4 <- aov(arguments_num ~ region, data = projectdata_recoded )
summary(data.aov_7_4)
             Df Sum Sq Mean Sq F value Pr(>F)
region        3   1.61  0.5371   0.515  0.673
Residuals   125 130.36  1.0429               
data.aov_7_5 <- aov(independent_child_num ~ region, data = projectdata_recoded )
summary(data.aov_7_5)
             Df Sum Sq Mean Sq F value Pr(>F)
region        3      4   1.332   1.914  0.131
Residuals   125     87   0.696               
data.aov_7_6 <- aov(relax_num ~ region, data = projectdata_recoded )
summary(data.aov_7_6)
             Df Sum Sq Mean Sq F value Pr(>F)
region        3   0.36  0.1186   0.145  0.932
Residuals   125 101.97  0.8158               
data.aov_7_7 <- aov(reasonable_num ~ region, data = projectdata_recoded )
summary(data.aov_7_7)
             Df Sum Sq Mean Sq F value Pr(>F)
region        3   5.94   1.980   1.708  0.169
Residuals   125 144.90   1.159               
# Ethnicity and Hispanic, Latino, or Spanish Origin

data.aov_8_1 <- aov(financial_support_num ~ hispanic *ethnicity, data = projectdata_recoded )
summary(data.aov_8_1)
             Df Sum Sq Mean Sq F value Pr(>F)
hispanic      4   5.09  1.2726   1.592  0.181
ethnicity     5   4.79  0.9579   1.198  0.314
Residuals   119  95.14  0.7995               
data.aov_8_2 <- aov(career_development_num ~ hispanic * ethnicity, data = projectdata_recoded)
summary(data.aov_8_2)
             Df Sum Sq Mean Sq F value Pr(>F)  
hispanic      4   6.97  1.7432   2.038 0.0934 .
ethnicity     5   6.48  1.2958   1.515 0.1902  
Residuals   119 101.77  0.8552                 
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
data.aov_8_3 <- aov(enough_time_num ~ hispanic * ethnicity, data = projectdata_recoded )
summary(data.aov_8_3)
             Df Sum Sq Mean Sq F value Pr(>F)
hispanic      4   2.80  0.7007   0.727  0.575
ethnicity     5   4.75  0.9504   0.986  0.429
Residuals   119 114.69  0.9638               
data.aov_8_4 <- aov(arguments_num ~ hispanic * ethnicity, data = projectdata_recoded )
summary(data.aov_8_4)
             Df Sum Sq Mean Sq F value Pr(>F)
hispanic      4   7.33  1.8326   1.818  0.130
ethnicity     5   4.66  0.9324   0.925  0.468
Residuals   119 119.98  1.0082               
data.aov_8_5 <- aov(independent_child_num ~ hispanic * ethnicity, data = projectdata_recoded )
summary(data.aov_8_5)
             Df Sum Sq Mean Sq F value  Pr(>F)   
hispanic      4   9.82  2.4539   3.802 0.00604 **
ethnicity     5   4.37  0.8740   1.354 0.24661   
Residuals   119  76.81  0.6454                   
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
data.aov_8_6 <- aov(relax_num ~ hispanic * ethnicity, data = projectdata_recoded )
summary(data.aov_8_6)
             Df Sum Sq Mean Sq F value Pr(>F)
hispanic      4   4.61   1.153   1.501  0.206
ethnicity     5   6.32   1.264   1.646  0.153
Residuals   119  91.39   0.768               
data.aov_8_7 <- aov(reasonable_num ~ hispanic * ethnicity, data = projectdata_recoded )
summary(data.aov_8_7)
             Df Sum Sq Mean Sq F value Pr(>F)  
hispanic      4   3.39   0.848   0.751 0.5595  
ethnicity     5  13.02   2.604   2.305 0.0487 *
Residuals   119 134.43   1.130                 
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
library(lsr)
posthocPairwiseT(x = data.aov_4_5,p.adjust.methods="none")

    Pairwise comparisons using t tests with pooled SD 

data:  independent_child_num and ethnicity 

                            American Indian or Alaska Native
Asian *** Asian Indian      0.899                           
Asian *** Chinese           1.000                           
Black, or African American  1.000                           
Pacific Islander *** Samoan 1.000                           
Prefer not to answer        0.078                           
Some other race             1.000                           
White                       1.000                           
                            Asian *** Asian Indian Asian *** Chinese
Asian *** Asian Indian      -                      -                
Asian *** Chinese           1.000                  -                
Black, or African American  0.859                  1.000            
Pacific Islander *** Samoan 1.000                  1.000            
Prefer not to answer        1.000                  0.243            
Some other race             0.505                  1.000            
White                       0.899                  1.000            
                            Black, or African American
Asian *** Asian Indian      -                         
Asian *** Chinese           -                         
Black, or African American  -                         
Pacific Islander *** Samoan 1.000                     
Prefer not to answer        0.039                     
Some other race             1.000                     
White                       1.000                     
                            Pacific Islander *** Samoan Prefer not to answer
Asian *** Asian Indian      -                           -                   
Asian *** Chinese           -                           -                   
Black, or African American  -                           -                   
Pacific Islander *** Samoan -                           -                   
Prefer not to answer        0.243                       -                   
Some other race             1.000                       0.021               
White                       1.000                       0.039               
                            Some other race
Asian *** Asian Indian      -              
Asian *** Chinese           -              
Black, or African American  -              
Pacific Islander *** Samoan -              
Prefer not to answer        -              
Some other race             -              
White                       1.000          

P value adjustment method: holm 
posthocPairwiseT(x = data.aov_5_5,p.adjust.methods="none")

    Pairwise comparisons using t tests with pooled SD 

data:  independent_child_num and hispanic 

                                                                   No , not of Hispanic, Latino, or Spanish origin
Yes, another Hispanic, Latino, or Spanish origin *** Argentina     0.0116                                         
Yes, another Hispanic, Latino, or Spanish origin *** Other Country 1.0000                                         
Yes, another Hispanic, Latino, or Spanish origin *** Venezuela     0.5904                                         
Yes, Mexican, Mexican American, Chicano                            1.0000                                         
                                                                   Yes, another Hispanic, Latino, or Spanish origin *** Argentina
Yes, another Hispanic, Latino, or Spanish origin *** Argentina     -                                                             
Yes, another Hispanic, Latino, or Spanish origin *** Other Country 0.0689                                                        
Yes, another Hispanic, Latino, or Spanish origin *** Venezuela     0.0066                                                        
Yes, Mexican, Mexican American, Chicano                            0.0066                                                        
                                                                   Yes, another Hispanic, Latino, or Spanish origin *** Other Country
Yes, another Hispanic, Latino, or Spanish origin *** Argentina     -                                                                 
Yes, another Hispanic, Latino, or Spanish origin *** Other Country -                                                                 
Yes, another Hispanic, Latino, or Spanish origin *** Venezuela     1.0000                                                            
Yes, Mexican, Mexican American, Chicano                            1.0000                                                            
                                                                   Yes, another Hispanic, Latino, or Spanish origin *** Venezuela
Yes, another Hispanic, Latino, or Spanish origin *** Argentina     -                                                             
Yes, another Hispanic, Latino, or Spanish origin *** Other Country -                                                             
Yes, another Hispanic, Latino, or Spanish origin *** Venezuela     -                                                             
Yes, Mexican, Mexican American, Chicano                            1.0000                                                        

P value adjustment method: holm 
posthocPairwiseT(x = data.aov_7_1,p.adjust.methods="none")

    Pairwise comparisons using t tests with pooled SD 

data:  financial_support_num and region 

          Midwest Northeast South
Northeast 0.748   -         -    
South     0.809   0.748     -    
West      0.072   0.748     0.015

P value adjustment method: holm 
posthocPairwiseT(x = data.aov_7_2,p.adjust.methods="none")

    Pairwise comparisons using t tests with pooled SD 

data:  career_development_num and region 

          Midwest Northeast South
Northeast 0.412   -         -    
South     1.000   0.321     -    
West      0.215   1.000     0.092

P value adjustment method: holm 
# Graphic
## Using box plot to show the differences of each groups

addline_format <- function(x,...){
    gsub('\\s','\n',x)
}

## Ethnicity Group ("Independent children" question)

projectdata_recoded %>%
ggplot (aes (y= `independent_child_num`, x= `ethnicity`, col= `ethnicity`))+
  geom_boxplot()+
   ggthemes::theme_few()+
   scale_y_continuous (name = "Mean for Independent \n  children choice")+
  scale_x_discrete(breaks=unique(projectdata_recoded$ethnicity), labels=addline_format(c("American Indian or Alaska Native",  "Asian *** Asian Indian", "Asian *** Chinese", "Black, or African American", "Pacific Islander *** Samoan","Prefer not to answer", "Some other race","White"
)))+
  scale_color_discrete(name="Ethnicity")+
  labs(title = "Mean for Independent children choice with in various ethnicity group")+
  theme(plot.title = element_text(hjust=0.5))+
  theme(legend.position = "bottom")+
    theme(axis.text.x = element_text(angle=90))+
   guides(col=guide_legend(nrow=4))+
  stat_summary(fun.y="mean")
Warning: The `fun.y` argument of `stat_summary()` is deprecated as of ggplot2 3.3.0.
ℹ Please use the `fun` argument instead.
Warning: Removed 8 rows containing missing values or values outside the scale range
(`geom_segment()`).

##Hispanic Group ("Independent Children" question)

projectdata_recoded %>%
ggplot (aes (y= `independent_child_num`, x= `hispanic`, col= `hispanic`))+
  geom_boxplot()+
   ggthemes::theme_few()+
  scale_x_discrete(breaks=unique(projectdata_recoded$hispanic), labels=addline_format(c("No , not of Hispanic, Latino, or Spanish origin", "Yes, another Hispanic, Latino, or Spanish origin *** Argentina", "Yes, another Hispanic, Latino, or Spanish origin *** Other Country", "Yes, another Hispanic, Latino, or Spanish origin *** Venezuela", "Yes, Mexican, Mexican American, Chicano")))+
   scale_y_continuous (name = "Mean for Independent children choice")+
  scale_color_discrete(name="Hispanic")+
  labs(title = "Mean for Independent children choice with in various hispanic group")+
  theme(plot.title = element_text(hjust=0.5))+
  theme(legend.position = "bottom")+
    theme(axis.text.x = element_text(angle=90))+
  guides(col=guide_legend(nrow=5)) +
  stat_summary(fun.y="mean")
Warning: Removed 5 rows containing missing values or values outside the scale range
(`geom_segment()`).

## Region Group 1 ("financial support" qestion)

projectdata_recoded %>%
ggplot (aes (y= `financial_support_num`, x= `region`, col= `region`))+
  geom_boxplot()+
   ggthemes::theme_few()+
   scale_y_continuous (name = "Mean for financial support choice")+
  labs(title = "Mean for financial support choice with in various region group")+
  theme(plot.title = element_text(hjust=0.5))+
  theme(legend.position = "bottom")+
    theme(axis.text.x = element_text(angle=90))+
  guides(col=guide_legend(nrow=2)) +
  stat_summary(fun.y="mean")
Warning: Removed 4 rows containing missing values or values outside the scale range
(`geom_segment()`).

##Region Group 2 ("financial support" question)

projectdata_recoded %>%
ggplot (aes (y= `career_development_num`, x= `region`, col= `region`))+
  geom_boxplot()+
   ggthemes::theme_few()+
   scale_y_continuous (name = "Mean for career development choice")+
  labs(title = "Mean for career development choice with in various region group")+
  theme(plot.title = element_text(hjust=0.5))+
  theme(legend.position = "bottom")+
    theme(axis.text.x = element_text(angle=90))+
  guides(col=guide_legend(nrow=2))+
  stat_summary(fun.y="mean")
Warning: Removed 4 rows containing missing values or values outside the scale range
(`geom_segment()`).

Interpretation

  1. The mean for the choice of agreement level about the statement “The family would raise independent children” is various across various ethnic groups. For instance, the mean for “Prefer not to answer” is statistically significantly different than the “Black, or African American” ethnicity group. The mean for “Some other race” and “white” are statistically significantly different than the “Prefer not to answer” group

  2. The mean for the choice of agreement level about the statement “The family would raise independent children” is various across various Hispanic ethnicity groups. For instance, the mean for “Yes, another Hispanic, Latino, or Spanish origin *** Argentina” is statistically significantly different than the “No, not of Hispanic, Latino, or Spanish origin” group, the mean for “Yes, another Hispanic, Latino, or Spanish origin *** Other Country” and “Yes, another Hispanic, Latino, or Spanish origin *** Venezuela” are statistical significant than “Yes, another Hispanic, Latino, or Spanish origin *** Argentina”

  3. The mean for the choice of agreement level about the statement “The family would provide enough financial support for the children.” varies across different region groups. For instance, the mean for the “west” group is statistically significant than the mean for the “south” group.

  4. The mean for the choice of agreement level about the statement “The family would be setting the children up well for future career development (social capital).” varies across different region groups. For instance, the mean for the “west” group is statistically significant than the mean for the “south” group.

Other Findings

library(ggpubr)
projectdata_recoded %>%
  ggplot(aes(x = as.factor(treatment), fill = as.factor(arguments_num))) +
  geom_bar(position = "fill") +
  labs(title = "Would this family have arguments about parenting household labor division?",
       x = "Treatment Groups: (1) Father (2) Mother (3) Both",
       y = "Percentage") 

both = projectdata_recoded %>%
  filter(treatment == 3) %>%
  ggplot(aes(x = financial_support_num)) +
  geom_bar() +
  labs(title = "Would this family be able to provide enough financial support?\nEqual",
       x = "Likert Scale",
       y = "Number of answers")

father = projectdata_recoded %>%
  filter(treatment == 1) %>%
  ggplot(aes(x = financial_support_num)) +
  geom_bar() +
  labs(x = "Likert Scale", title = "Father")

mother = projectdata_recoded %>%
  filter(treatment == 2) %>%
  ggplot(aes(x = financial_support_num)) +
  geom_bar() +
  labs(x = "Likert Scale", title = "Mother")

ggarrange(mother, father, both) + labs(title = "dkfjlk;asdjf")

projectdata_recoded %>%
  ggplot(aes(x = as.factor(treatment), fill = as.factor(financial_support_num))) +
  geom_bar(position = "fill") +
  labs(title = "Would this family be able to provide enough financial support?",
       x = "Treatment Groups: (1) Father (2) Mother (3) Both",
       y = "Percentage") 

Here, we can see that between the three treatment groups, those who were exposed to the story where both parents shared time equally, had the lowest rate of negative opinions when asked whether the family would argue frequently.

We can also see that, when asked if the family could effectively financially support the children, the both options received the highest amount of confident votes. Interestingly, the treatment group that received the mother story had the second highest amount of votes.