AI Experiment Analysis

Loading Libraries

library(afex) # to run the ANOVA and plot results
library(psych) # for the describe() command
library(ggplot2) # to visualize our results
library(expss) # for the cross_cases() command
library(car) # for the leveneTest() command
library(emmeans) # for posthoc tests
library(effsize) # for the cohen.d() command
library(apaTables) # to create our correlation table
library(kableExtra) # to create our correlation table
library(sjPlot) # to visualize our results

Importing Data

# # import your AI results dataset
d <- read.csv(file="Data/final_results(results_c1 (2)).csv", header=T)

State Your Hypotheses & Chosen Tests

H1:I predict participants who engage in regular exercise will report lower levels of stress than those who do not exercise.

H2:I predict that participants with higher levels of anxiety will report higher levels of stress overall, regardless of their exercise habits.

tests- H1: Independent samples t-test

H2:Pearson correlation

H2(control):Multiple Regression

Check Your Variables

This is just basic variable checking that is used across all HW assignments.

# # to view stats for all variables
 describe(d)
           vars   n  mean    sd median trimmed   mad   min    max range  skew
id            1 100 50.50 29.01  50.50   50.50 37.06  1.00 100.00 99.00  0.00
identity*     2 100 50.50 29.01  50.50   50.50 37.06  1.00 100.00 99.00  0.00
consent*      3 100  1.92  0.27   2.00    2.00  0.00  1.00   2.00  1.00 -3.05
age           4 100 37.88 11.40  34.00   36.29  2.97 18.00  80.00 62.00  1.53
race          5 100  4.54  1.60   5.00    4.61  1.48  1.00   7.00  6.00 -0.19
gender        6 100  1.90  0.46   2.00    1.96  0.00  1.00   5.00  4.00  2.09
manip_out*    7 100 28.84 11.37  31.00   29.30  2.22  1.00  53.00 52.00 -0.47
survey1       8 100  2.86  0.28   2.71    2.83  0.11  2.14   3.57  1.43  0.85
survey2       9 100  2.70  0.19   2.75    2.72  0.00  2.00   3.25  1.25 -0.87
ai_manip*    10 100 50.50 29.01  50.50   50.50 37.06  1.00 100.00 99.00  0.00
condition    11 100  1.50  0.50   1.50    1.50  0.74  1.00   2.00  1.00  0.00
           kurtosis   se
id            -1.24 2.90
identity*     -1.24 2.90
consent*       7.38 0.03
age            2.14 1.14
race          -1.59 0.16
gender        19.42 0.05
manip_out*     0.28 1.14
survey1        0.50 0.03
survey2        3.19 0.02
ai_manip*     -1.24 2.90
condition     -2.02 0.05
# 
# # we'll use the describeBy() command to view skew and kurtosis across our IVs
describeBy(d, group = "condition")

 Descriptive statistics by group 
condition: 1
          vars  n  mean    sd median trimmed   mad   min    max range  skew
id           1 50 25.50 14.58  25.50   25.50 18.53  1.00  50.00 49.00  0.00
identity     2 50 46.52 30.31  51.50   46.00 36.32  1.00 100.00 99.00  0.00
consent      3 50  1.98  0.14   2.00    2.00  0.00  1.00   2.00  1.00 -6.65
age          4 50 36.72 11.01  34.00   35.10  2.97 21.00  77.00 56.00  1.73
race         5 50  4.40  1.68   4.00    4.50  2.97  1.00   7.00  6.00 -0.17
gender       6 50  1.92  0.57   2.00    1.95  0.00  1.00   5.00  4.00  2.63
manip_out    7 50 26.34 15.44  25.50   26.30 20.02  1.00  52.00 51.00  0.03
survey1      8 50  2.86  0.28   2.71    2.82  0.00  2.14   3.57  1.43  0.80
survey2      9 50  2.74  0.17   2.75    2.75  0.00  2.25   3.25  1.00 -0.65
ai_manip    10 50 34.44 26.54  27.50   31.45 26.69  1.00 100.00 99.00  0.82
condition   11 50  1.00  0.00   1.00    1.00  0.00  1.00   1.00  0.00   NaN
          kurtosis   se
id           -1.27 2.06
identity     -1.32 4.29
consent      43.12 0.02
age           2.88 1.56
race         -1.59 0.24
gender       15.56 0.08
manip_out    -1.33 2.18
survey1       0.71 0.04
survey2       2.87 0.02
ai_manip     -0.29 3.75
condition      NaN 0.00
------------------------------------------------------------ 
condition: 2
          vars  n  mean    sd median trimmed   mad   min    max range  skew
id           1 50 75.50 14.58  75.50   75.50 18.53 51.00 100.00 49.00  0.00
identity     2 50 54.48 27.38  48.50   54.35 35.58 10.00  98.00 88.00  0.09
consent      3 50  1.86  0.35   2.00    1.95  0.00  1.00   2.00  1.00 -2.01
age          4 50 39.04 11.76  34.00   37.45  2.97 18.00  80.00 62.00  1.33
race         5 50  4.68  1.52   6.00    4.70  1.48  2.00   7.00  5.00 -0.15
gender       6 50  1.88  0.33   2.00    1.98  0.00  1.00   2.00  1.00 -2.27
manip_out    7 50 31.34  3.14  31.00   31.00  0.00 30.00  53.00 23.00  6.55
survey1      8 50  2.87  0.28   2.71    2.84  0.21  2.29   3.57  1.29  0.88
survey2      9 50  2.67  0.19   2.75    2.70  0.00  2.00   3.25  1.25 -1.00
ai_manip    10 50 66.56 21.68  68.50   67.65 23.72 14.00  99.00 85.00 -0.42
condition   11 50  2.00  0.00   2.00    2.00  0.00  2.00   2.00  0.00   NaN
          kurtosis   se
id           -1.27 2.06
identity     -1.41 3.87
consent       2.10 0.05
age           1.47 1.66
race         -1.77 0.21
gender        3.21 0.05
manip_out    42.27 0.44
survey1       0.15 0.04
survey2       3.15 0.03
ai_manip     -0.75 3.07
condition      NaN 0.00
# 
# # also use histograms and scatterplots to examine your continuous variables
hist(d$survey1)

hist(d$survey2)

plot(d$survey1, d$survey2)

# 
# # and table() and cross_cases() to examine your categorical variables
# # you may not need the cross_cases code
table(d$condition)  

 1  2 
50 50 
# cross_cases(d, IV1, IV2)
# 
# # and boxplot to examine any categorical variables with continuous variables
boxplot(d$survey1 ~ d$condition)

# 
# #convert any categorical variables to factors
d$condition <- as.factor(d$condition)

Check Your Assumptions

t-Test Assumptions

  • Data values must be independent (independent t-test only) (confirmed by data report)
  • Data obtained via a random sample (confirmed by data report)
  • IV must have two levels (will check below)
  • Dependent variable must be normally distributed (will check below. if issues, note and proceed)
  • Variances of the two groups must be approximately equal, aka ‘homogeneity of variance’. Lacking this makes our results inaccurate (will check below - this really only applies to Student’s t-test, but we’ll check it anyway)

Checking IV levels

# # preview the levels and counts for your IV
# table(d$iv, useNA = "always")
# 
# # note that the table() output shows you exactly how the levels of your variable are written. when recoding, make sure you are spelling them exactly as they appear
# 
# # to drop levels from your variable
# # this subsets the data and says that any participant who is coded as 'BAD' should be removed
# d <- subset(d, IV != "BAD")
# 
# table(d$iv, useNA = "always")
# 
# # to combine levels
# # this says that where any participant is coded as 'BAD' it should be replaced by 'GOOD'
# d$iv_rc[d$iv == "BAD"] <- "GOOD"
# 
# table(d$iv, useNA = "always")
# 
# # check your variable types
# str(d)
# 
# # make sure that your IV is recognized as a factor by R
# # if you created a new _rc variable make sure to use that one instead
d$condition <- as.factor(d$condition)

Testing Homogeneity of Variance with Levene’s Test

We can test whether the variances of our two groups are equal using Levene’s test. The null hypothesis is that the variance between the two groups is equal, which is the result we want. So when running Levene’s test we’re hoping for a non-significant result!

# # use the leveneTest() command from the car package to test homogeneity of variance
# # uses the same 'formula' setup that we'll use for our t-test: formula is y~x, where y is our DV and x is our IV
leveneTest(survey1~condition, data = d)
Levene's Test for Homogeneity of Variance (center = median)
      Df F value Pr(>F)
group  1  0.0291 0.8649
      98               

Pearson’s Correlation Coefficient Assumptions

  • Should have two measurements for each participant for each variable (confirmed by earlier procedures – we dropped any participants with missing data)
  • Variables should be continuous and normally distributed, or assessments of the relationship may be inaccurate (will do below)
  • Outliers should be identified and removed, or results will be inaccurate (will do below)
  • Relationship between the variables should be linear, or they will not be detected (will do below)

Run a Multiple Linear Regression

To check the assumptions for Pearson’s correlation coefficient, we run our regression and then check our diagnostic plots.

# # use the lm() command to run the regression
# # dependent/outcome variable on the left, independent/predictor variables on the right
# reg_model <- lm(dv ~ iv1 + iv2, data = d)
reg_model <- lm(survey2 ~ survey1, data = d)

Check linearity with Residuals vs Fitted plot

For some examples of good Residuals vs Fitted plot and ones that show serious errors, check out this page.

For your homework, you’ll simply need to generate this plot and talk about how your plot compares to the good and problematic plots linked to above. Is it closer to the ‘good’ plots or one of the ‘bad’ plots? This is going to be a judgement call, and that’s okay! In practice, you’ll always be making these judgement calls as part of a team, so this assignment is just about getting experience with it, not making the perfect call.

plot(reg_model, 1)

Check for outliers using Cook’s distance and a Residuals vs Leverage plot

For your homework, you’ll simply need to generate these plots, assess Cook’s distance in your dataset, and then identify any potential cases that are prominent outliers.

# # Cook's distance
plot(reg_model, 4)

plot(reg_model, 5)

# 
# # Residuals vs Leverage
#plot(reg_model, 5)

Issues with My Data

There is no indicators of outliers from cooks distance.

Run Your Analysis

Run a t-Test

# # very simple! we specify the dataframe alongside the variables instead of having a separate argument for the dataframe like we did for leveneTest()
t_output <- t.test(d$survey1~d$condition)

View Test Output

t_output

    Welch Two Sample t-test

data:  d$survey1 by d$condition
t = -0.15464, df = 97.993, p-value = 0.8774
alternative hypothesis: true difference in means between group 1 and group 2 is not equal to 0
95 percent confidence interval:
 -0.1185658  0.1014230
sample estimates:
mean in group 1 mean in group 2 
       2.857143        2.865714 

Calculate Cohen’s d

# # once again, we use our formula to calculate cohen's d
d_output <- cohen.d(d$survey1~d$condition)

View Effect Size

  • Trivial: < .2
  • Small: between .2 and .5
  • Medium: between .5 and .8
  • Large: > .8
d_output

Cohen's d

d estimate: -0.03092837 (negligible)
95 percent confidence interval:
     lower      upper 
-0.4278456  0.3659888 

Run a Correlation Test

Create a Correlation Matrix

d2 <- subset(d, select=c(survey1,survey2))

corr_output_m <- corr.test(d2)

View Test Output

  • Strong effect: Between |0.50| and |1|
  • Moderate effect: Between |0.30| and |0.49|
  • Weak effect: Between |0.10| and |0.29|
  • Trivial effect: Less than |0.09|
corr_output_m
Call:corr.test(x = d2)
Correlation matrix 
        survey1 survey2
survey1    1.00   -0.12
survey2   -0.12    1.00
Sample Size 
[1] 100
Probability values (Entries above the diagonal are adjusted for multiple tests.) 
        survey1 survey2
survey1    0.00    0.22
survey2    0.22    0.00

 To see confidence intervals of the correlations, print with the short=FALSE option

Write Up Results

t-Test

Results: t = 0.98084, df = 97.18, p-value = 0.3291

The p-value is greater than 0.05, indicating that there is no statistically significant difference in the PSS scores between the two groups. This suggests that exercise did not significantly impact stress levels in the sample.

Correlation Test

Write-up of your results goes here. Check past labs/HWs for template. Depending on how many variables you have here, I may need to help you tweak your table output.

A Pearson correlation was conducted to examine the relationship between anxiety (survey2) and stress (survey1). The correlation was negative and non-significant, r(98) = -0.12, p = .22, indicating no evidence of a linear association between anxiety and stress in this sample.

Variable M SD 1
Stress 2.86 0.28
Anxiety 2.71 0.19 -.12
[-.31, .08]
Note:
M and SD are used to represent mean and standard deviation, respectively. Values in square brackets indicate the 95% confidence interval. The confidence interval is a plausible range of population correlations that could have caused the sample correlation.
* indicates p < .05
** indicates p < .01.

References

Cohen J. (1988). Statistical Power Analysis for the Behavioral Sciences. New York, NY: Routledge Academic.