This is a continuation of the original Cog_Interference analysis, now considering the the relationship that mood has with category learning. First, we will need to import our clean dataframe from the original analysis and then combine it with a .csv file that was used to save the mood information. Mood information is saved as a level of positive affect and negative affect, one measure for each participant. The higher the value a mood measure has, the greater that participant is represented by that mood.
library(tidyverse)
library(car)
library(ggplot2)
#Set working Directory
knitr::opts_knit$set(root.dir = normalizePath("C:\\Users\\Josh\\Dropbox\\COVIS Interference\\csvfolder"))
Cat = read.delim("cogintdataframe.txt", header=TRUE,sep="\t")
Mood = read.delim("moodvalues.txt", header=TRUE,sep="\t")
dfB = merge(Cat, Mood, by.x="Participant")
View(dfB)
Now lets run some very simple analysis. First thing we might want to know, is whether there is even a relationship between Mood and Category learning ability. To look at this we’ll need to conduct a number of Correlations, one for each groups we’re interested in (our six groups found in our original data frame), by each mood level (either positive or negative). As such, we’ll be running a total of 12 independent correlations. We’ll begin with our correlations between Positive Affect Level and Category Learning Accuracy. For the time being, we will look at the level of Category Learning Accuracy across all four blocks. In order to do this, we’ll need to create a new data frame that only have one accuracy score for each participant.
dfnoB = dfB %>%
group_by(Participant, Category, Concurrent, POS, NEG) %>%
summarise(MeanAcc = mean(Accuracy))
#dfnoB = merge(dfnoB, Mood, by.x = "Participant")
View(dfnoB)
The following plots show the relationship between Negative Affect and Accuracy in our Rule-Described category Set, and Positive Affect and Accuracy in our Rule-Describe Category Set. Bear in mind that each of these plots looks at Accuracy across all four blocks, so we do not see the effect of learning - only their ability level across 320 trials.
Before we can begin, we’ll need to create a subset for only our Rule-Described data. We’ll do that here, and then call to it for each of the following Rule-Described descriptive plots.
RDdfnoB = subset(dfnoB, Category == 'RD')
View(RDdfnoB)
To begin, we’ll create a plot that visualizes the relationship between Negative Affect and Accuracy in the control task; as well as Positive Affect and Accuracy in the control task.
RDdfnoBC = subset(RDdfnoB, Concurrent == 'Control')
RDControlplot = ggplot(RDdfnoBC, aes(x=MeanAcc)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Total Accuracy")+
ylab("Level of Affect")+
ggtitle("Rule-Described Control Group: \n Level of Affect by Accuracy")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
RDControlplot
We can see from this plot that there doesn’t appear to be a strong relationship between either Affect type and Accuracy in the control Rule-Described category set. There appears to be a slight positive relationship between Negative Affect and Accuracy; our inferential statistics will attempt to elaborate more on this later. In general, Negative Affect levels appeared to be lower than Positive Affect Levels.
Next, we’ll create a visualization for the relationship between Negative Affect and Accuracy in the Verbal Interference task; as well as Positive Affect and Accuracy in the Verbal Interference task.
RDdfnoBV = subset(RDdfnoB, Concurrent == 'Letters')
RDVerbalplot = ggplot(RDdfnoBV, aes(x=MeanAcc)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Total Accuracy")+
ylab("Level of Affect")+
ggtitle("Rule-Described Verbal Interference Group: \n Level of Affect by Accuracy")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
RDVerbalplot
In this graph we can see a more dramatic negative relationship between Positive Affect level and performance in the Verbal Interference Group. It would appear that as level of Positive Affect decreased, performance in the Verbal Interference Group also decreased. This indicates to us that if participants had lower levels of Positive Affect, then it may have decreased working memory capacity, resulting in poorer performance on a categorization task when being distracted by another task that used working memory.
Last for the Rule-Described category set, we’ll create a visualization for the relationship between Negative Affect and Accuracy in the Non-Verbal Interference task; as well as Positive Affect and Accuracy in the Non-Verbal Interference task.
RDdfnoBNV = subset(RDdfnoB, Concurrent == 'Tapping')
RDNonVerbalplot = ggplot(RDdfnoBNV, aes(x=MeanAcc)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Total Accuracy")+
ylab("Level of Affect")+
ggtitle("Rule-Described Non-Verbal Interference Group: \n Level of Affect by Accuracy")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
RDNonVerbalplot
Here we can see a slight positive relationship between level of Positive Affect and Total Accuracy, such that as accuracy increases, so too does level of Positive Affect. The relationship is not dramatic though, and we’ll confirm whether this exists in our inferential statistics.
The following plots show the relationship between Negative Affect and Accuracy in the Information Integration Category Set, and Positive Affect and Accuracy in the Information Integration Category Set. Bear in mind that each of these plots looks at Accuracy across all four blocks, so we do not see the effect of learning - only their ability level across 320 trials.
Before we can begin, we’ll need to create a subset for only our Information Integration data. We’ll do that here, and then call to it for each of the following Information Integration descriptive plots.
IIdfnoB = subset(dfnoB, Category == 'II')
View(IIdfnoB)
To begin, we’ll create a plot that visualizes the relationship between Negative Affect and Accuracy in the control task; as well as Positive Affect and Accuracy in the control task.
IIdfnoBC = subset(IIdfnoB, Concurrent == 'Control')
# We've just made a subset for the Control data
IIControlplot = ggplot(IIdfnoBC, aes(x=MeanAcc)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Total Accuracy")+
ylab("Level of Affect")+
ggtitle("Information Integration Control Group: \n Level of Affect by Accuracy")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
IIControlplot
We can see in this graph that there doesn’t appear to be any visual relationship between either dimension of affect and accuracy in the control group.
Next, we’ll create a visualization for the relationship between Negative Affect and Accuracy in the Verbal Interference task; as well as Positive Affect and Accuracy in the Verbal Interference task.
IIdfnoBV = subset(IIdfnoB, Concurrent == 'Letters')
# We've just made a subset for the Verbal Interference data
IIVerbalplot = ggplot(IIdfnoBV, aes(x=MeanAcc)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Total Accuracy")+
ylab("Level of Affect")+
ggtitle("Information Integration Verbal Interference Group: \n Level of Affect by Accuracy")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
IIVerbalplot
Again, we don’t see any dramatic visual relationships, though there does appear to be a slight negative relationship between Positive Affect and Accuracy, and a slight positive relationship between Negative Affect and Accuracy. Inferential statistics will confirm or deny this.
Last for the Information Integration category set, we’ll create a visualization for the relationship between Negative Affect and Accuracy in the Non-Verbal Interference task; as well as Positive Affect and Accuracy in the Non-Verbal Interference task.
IIdfnoBNV = subset(IIdfnoB, Concurrent == 'Tapping')
# We've just made a subset for the Non-Verbal Interference data
IINonVerbalplot = ggplot(IIdfnoBNV, aes(x=MeanAcc)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Total Accuracy")+
ylab("Level of Affect")+
ggtitle("Information Integration Non-Verbal Interference Group: \n Level of Affect by Accuracy")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
IINonVerbalplot
There doesn’t appear to be any visual relationships between either dimension of Affect and Accuracy in the Non-Verbal Interference task. However, there might be a slight relationship between Positive Affect level and Accuracy. Inferential Statistics will either confirm or deny this.
Our first set of descriptive statistics took a look at the relationship between Mood and Accuracy across all Blocks for each participant. While this tells us what the relationship looks like against a total accuracy score, it doesn’t give us any insight into the effect of learning. As this is a task where participants go through 320 images and attempt to learn a category rule through trial and error, it is important for us to assess how learning was impacted. In the other Rpubs notebook related to this study, we looked at the impact that concurrent tasks can have on learning in each block. Now, we’ll look a the relationship that Mood shares with performance in each block. The reason why this is important is because it can tell us whether Mood played a significant role in initial or late-stage learning.
The following plots show the relationship between Negative Affect and Accuracy in our Rule-Described category Set, and Positive Affect and Accuracy in our Rule-Describe Category Set. Each of the following plots shows performance at each Block.
Before we can begin, we’ll need to create a subset for only our Rule-Described data at Block 1. We’ll do that here, and then call to it for each of the following Rule-Described descriptive plots.
RDdfB1 = subset(dfB, Category == 'RD')
RDdfB1 = subset(RDdfB1, Block == '0')
View(RDdfB1)
RDdfB1C = subset(RDdfB1, Concurrent == 'Control')
RDB1Controlplot = ggplot(RDdfB1C, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 1")+
ylab("Level of Affect")+
ggtitle("Rule-Described Control Group: \n Level of Affect by Accuracy at Block 1")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
RDB1Controlplot
We can see a slight trend towards a negative relationship between level of Positive Affect and Accuracy at Block 1.
RDdfB1V = subset(RDdfB1, Concurrent == 'Letters')
RDB1Verbalplot = ggplot(RDdfB1V, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 1")+
ylab("Level of Affect")+
ggtitle("Rule-Described Verbal Interference Group: \n Level of Affect by Accuracy at Block 1")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
RDB1Verbalplot
We can see a slight negative relationship between Positive Affect and Accuracy at Block 1, but at this point it looks almost negligible.
RDdfB1NV = subset(RDdfB1, Concurrent == 'Tapping')
RDB1NonVerbalplot = ggplot(RDdfB1NV, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 1")+
ylab("Level of Affect")+
ggtitle("Rule-Described Non-Verbal Interference Group: \n Level of Affect by Accuracy at Block 1")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
RDB1NonVerbalplot
We can see a more dramatic positive relationship here between Positive Affect and Accuracy at Block 1, as well as a slight negative relationship between Negative Affect and Accuracy at Block 1.
Before we can begin, we’ll need to create a subset for only our Rule-Described data at Block 1. We’ll do that here, and then call to it for each of the following Rule-Described descriptive plots.
RDdfB2 = subset(dfB, Category == 'RD')
RDdfB2 = subset(RDdfB2, Block == '1')
View(RDdfB2)
RDdfB2C = subset(RDdfB2, Concurrent == 'Control')
RDB2Controlplot = ggplot(RDdfB2C, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 2")+
ylab("Level of Affect")+
ggtitle("Rule-Described Control Group: \n Level of Affect by Accuracy at Block 2")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
RDB2Controlplot
We can see a slight trend towards a positive relationship between level of Negative Affect and Accuracy at Block 2.
RDdfB2V = subset(RDdfB2, Concurrent == 'Letters')
RDB2Verbalplot = ggplot(RDdfB2V, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 2")+
ylab("Level of Affect")+
ggtitle("Rule-Described Verbal Interference Group: \n Level of Affect by Accuracy at Block 2")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
RDB2Verbalplot
We can see a negative relationship between Positive Affect and Accuracy at Block 2.
RDdfB2NV = subset(RDdfB2, Concurrent == 'Tapping')
RDB2NonVerbalplot = ggplot(RDdfB2NV, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 2")+
ylab("Level of Affect")+
ggtitle("Rule-Described Non-Verbal Interference Group: \n Level of Affect by Accuracy at Block 2")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
RDB2NonVerbalplot
There doesn’t seem to be much of a strong relationship with either dimension of Affect type and performance at Block 2. Perhaps a slightly positive relationship between Positive Affect and Accuracy, and a slightly negative relationship between Negative Affect and Accuracy - but at this point, it looks somewhat negligible. Inferential statistics will tell.
Before we can begin, we’ll need to create a subset for only our Rule-Described data at Block 1. We’ll do that here, and then call to it for each of the following Rule-Described descriptive plots.
RDdfB3 = subset(dfB, Category == 'RD')
RDdfB3 = subset(RDdfB3, Block == '2')
View(RDdfB3)
RDdfB3C = subset(RDdfB3, Concurrent == 'Control')
RDB3Controlplot = ggplot(RDdfB3C, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 3")+
ylab("Level of Affect")+
ggtitle("Rule-Described Control Group: \n Level of Affect by Accuracy at Block 3")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
RDB3Controlplot
We can see a slight positive relationship between level of Negative Affect and Accuracy at Block 3.
RDdfB3V = subset(RDdfB3, Concurrent == 'Letters')
RDB3Verbalplot = ggplot(RDdfB3V, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 3")+
ylab("Level of Affect")+
ggtitle("Rule-Described Verbal Interference Group: \n Level of Affect by Accuracy at Block 3")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
RDB3Verbalplot
We can see a negative relationship between Positive Affect and Accuracy at Block 3.
RDdfB3NV = subset(RDdfB3, Concurrent == 'Tapping')
RDB3NonVerbalplot = ggplot(RDdfB3NV, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 3")+
ylab("Level of Affect")+
ggtitle("Rule-Described Non-Verbal Interference Group: \n Level of Affect by Accuracy at Block 3")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
RDB3NonVerbalplot
We can see a slightly positive relationship here between Positive Affect and Accuracy at Block 3.
Before we can begin, we’ll need to create a subset for only our Rule-Described data at Block 1. We’ll do that here, and then call to it for each of the following Rule-Described descriptive plots.
RDdfB4 = subset(dfB, Category == 'RD')
RDdfB4 = subset(RDdfB4, Block == '3')
View(RDdfB4)
RDdfB4C = subset(RDdfB4, Concurrent == 'Control')
RDB4Controlplot = ggplot(RDdfB4C, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 4")+
ylab("Level of Affect")+
ggtitle("Rule-Described Control Group: \n Level of Affect by Accuracy at Block 4")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
RDB4Controlplot
We can see a slight positive relationship between level of Negative Affect and Accuracy at Block 4.
RDdfB4V = subset(RDdfB4, Concurrent == 'Letters')
RDB4Verbalplot = ggplot(RDdfB4V, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 4")+
ylab("Level of Affect")+
ggtitle("Rule-Described Verbal Interference Group: \n Level of Affect by Accuracy at Block 4")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
RDB4Verbalplot
We can see a negative relationship between Positive Affect and Accuracy at Block 4.
RDdfB4NV = subset(RDdfB4, Concurrent == 'Tapping')
RDB4NonVerbalplot = ggplot(RDdfB4NV, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 4")+
ylab("Level of Affect")+
ggtitle("Rule-Described Non-Verbal Interference Group: \n Level of Affect by Accuracy at Block 4")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
RDB4NonVerbalplot
There doesn’t seem to be much of a strong relationship with either dimension of Affect type and performance at Block 4.
The following plots show the relationship between Negative Affect and Accuracy in our Information Integration category Set, and Positive Affect and Accuracy in our Information Integration Category Set. Each of the following plots shows performance at each Block.
Before we can begin, we’ll need to create a subset for only our Rule-Described data at Block 1. We’ll do that here, and then call to it for each of the following Rule-Described descriptive plots.
IIdfB1 = subset(dfB, Category == 'II')
IIdfB1 = subset(IIdfB1, Block == '0')
View(IIdfB1)
IIdfB1C = subset(IIdfB1, Concurrent == 'Control')
IIB1Controlplot = ggplot(IIdfB1C, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 1")+
ylab("Level of Affect")+
ggtitle("Information Integration Control Group: \n Level of Affect by Accuracy at Block 1")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
IIB1Controlplot
There doesn’t seem to be much of a strong relationship with either dimension of Affect type and performance at Block 1.
IIdfB1V = subset(IIdfB1, Concurrent == 'Letters')
IIB1Verbalplot = ggplot(IIdfB1V, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 1")+
ylab("Level of Affect")+
ggtitle("Information Integration Verbal Interference Group: \n Level of Affect by Accuracy at Block 1")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
IIB1Verbalplot
We can see a slight negative relationship between Positive Affect and Accuracy and a slight positive relationship between Negative Affect and Accuracy at Block 1.
IIdfB1NV = subset(IIdfB1, Concurrent == 'Tapping')
IIB1NonVerbalplot = ggplot(IIdfB1NV, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 1")+
ylab("Level of Affect")+
ggtitle("Information Integration Non-Verbal Interference Group: \n Level of Affect by Accuracy at Block 1")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
IIB1NonVerbalplot
We can see a slight negative relationship here between Positive Affect and Accuracy, as well as a slight positive relationship between Negative Affect and Accuracy at Block 1.
Before we can begin, we’ll need to create a subset for only our Rule-Described data at Block 1. We’ll do that here, and then call to it for each of the following Rule-Described descriptive plots.
IIdfB2 = subset(dfB, Category == 'II')
IIdfB2 = subset(IIdfB2, Block == '1')
View(IIdfB2)
IIdfB2C = subset(IIdfB2, Concurrent == 'Control')
IIB2Controlplot = ggplot(IIdfB2C, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 2")+
ylab("Level of Affect")+
ggtitle("Information Integration Control Group: \n Level of Affect by Accuracy at Block 2")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
IIB2Controlplot
There appears to be very slight correlations between both Positive and Negative Affect, and Accuracy at Block 2.
IIdfB2V = subset(IIdfB2, Concurrent == 'Letters')
IIB2Verbalplot = ggplot(IIdfB2V, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 2")+
ylab("Level of Affect")+
ggtitle("Information Integration Verbal Interference Group: \n Level of Affect by Accuracy at Block 2")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
IIB2Verbalplot
We can see a slight negative relationship between Positive Affect and Accuracy and a slight positive relationship between Negative Affect and Accuracy at Block 2.
IIdfB2NV = subset(IIdfB2, Concurrent == 'Tapping')
IIB2NonVerbalplot = ggplot(IIdfB2NV, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 2")+
ylab("Level of Affect")+
ggtitle("Information Integration Non-Verbal Interference Group: \n Level of Affect by Accuracy at Block 2")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
IIB2NonVerbalplot
We can see a positive relationship here between Positive Affect and Accuracy, as well as a negative relationship between Negative Affect and Accuracy at Block 2.
Before we can begin, we’ll need to create a subset for only our Rule-Described data at Block 1. We’ll do that here, and then call to it for each of the following Rule-Described descriptive plots.
IIdfB3 = subset(dfB, Category == 'II')
IIdfB3 = subset(IIdfB3, Block == '2')
View(IIdfB3)
IIdfB3C = subset(IIdfB3, Concurrent == 'Control')
IIB3Controlplot = ggplot(IIdfB3C, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 3")+
ylab("Level of Affect")+
ggtitle("Information Integration Control Group: \n Level of Affect by Accuracy at Block 3")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
IIB3Controlplot
There appears to be very slight correlations between both Positive and Negative Affect, and Accuracy at Block 3.
IIdfB3V = subset(IIdfB3, Concurrent == 'Letters')
IIB3Verbalplot = ggplot(IIdfB3V, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 3")+
ylab("Level of Affect")+
ggtitle("Information Integration Verbal Interference Group: \n Level of Affect by Accuracy at Block 3")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
IIB3Verbalplot
We can see a slight negative relationship between Positive Affect and Accuracy and a slight positive relationship between Negative Affect and Accuracy at Block 3.
IIdfB3NV = subset(IIdfB3, Concurrent == 'Tapping')
IIB3NonVerbalplot = ggplot(IIdfB3NV, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 3")+
ylab("Level of Affect")+
ggtitle("Information Integration Non-Verbal Interference Group: \n Level of Affect by Accuracy at Block 3")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
IIB3NonVerbalplot
We can see a positive relationship here between Positive Affect and Accuracy, as well as a negative relationship between Negative Affect and Accuracy at Block 3.
Before we can begin, we’ll need to create a subset for only our Rule-Described data at Block 1. We’ll do that here, and then call to it for each of the following Rule-Described descriptive plots.
IIdfB4 = subset(dfB, Category == 'II')
IIdfB4 = subset(IIdfB4, Block == '3')
View(IIdfB4)
IIdfB4C = subset(IIdfB4, Concurrent == 'Control')
IIB4Controlplot = ggplot(IIdfB4C, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 4")+
ylab("Level of Affect")+
ggtitle("Information Integration Control Group: \n Level of Affect by Accuracy at Block 4")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
IIB4Controlplot
There appears to be avery slight negative relationship between Negative Affect and Accuracy at Block 4.
IIdfB4V = subset(IIdfB4, Concurrent == 'Letters')
IIB4Verbalplot = ggplot(IIdfB4V, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 4")+
ylab("Level of Affect")+
ggtitle("Information Integration Verbal Interference Group: \n Level of Affect by Accuracy at Block 4")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
IIB4Verbalplot
There appears to be no relationship between either dimension of Affect Type and Accuracy at Block 4.
IIdfB4NV = subset(IIdfB4, Concurrent == 'Tapping')
IIB4NonVerbalplot = ggplot(IIdfB4NV, aes(x=Accuracy)) +
geom_point(aes(y = POS, color = "POS"))+
geom_smooth(method = lm, aes(y = POS), color = "turquoise3")+
geom_point(aes(y = NEG, color = "NEG"))+
geom_smooth(method = lm, aes(y = NEG), color = "red")+
xlab("Accuracy at Block 4")+
ylab("Level of Affect")+
ggtitle("Information Integration Non-Verbal Interference Group: \n Level of Affect by Accuracy at Block 4")+
guides(col= guide_legend(title = "Affect Type"))+
scale_color_manual(labels = c("Negative", "Positive"), values = c("red", "turquoise3"))
IIB4NonVerbalplot
We can see a slightly positive relationship here between Positive Affect and Accuracy, as well as a slightly positive relationship between Negative Affect and Accuracy at Block 4.