Murphy belongs to Kit Buckley, the residential life manager at Orchard Park. He spends three days per week at Orchard Park, outside the administration cabin, going on walks with staff and students. The assessment location was therefore selected as Murphy’s everyday enviroment - by the administration cabin. The preference assessment took around 20 minutes. Unfortunately, as noted below, minor errors occured while collecting the data and this has been compensated for using simple scaling. The preference assessment process was video recorded and this video file is available to project supervisors on the shared Google Drive directory.
Potential reinforcers that were presented in the preference assessment:
All of these were purchased from the Countdown grocery store on Peachgrove Rd, Hamilton.
Data was manually recorded on the data sheet by circling the stimulus Murphy choose with each pairing. This data was loaded into an excel spreadsheet and was imported in R for analysis. The raw data sheet is displayed below.
Preference Data Sheet
The data was imported and tidied.
preferenceAssessment.df <- read.csv("PreferenceAssessment.csv")
colnames(preferenceAssessment.df) <- c("Left Stimulus","Right Stimulus","Selected Stimulus")
#kable(preferenceAssessment.df) %>%
# kable_styling("striped", full_width = F)
levels(preferenceAssessment.df[,"Left Stimulus"]) <- list(A="Meaty Rings",B="Choc Treats",C="Salmon and Potato",D="Cooked Chicken Breast",E="Baxters Beef Straps",F="Duck Tenders")A combination column was then created to check for duplicate combinations. This was done by creating a frequency table of the possible combinations. As can be seen, there are two errors, where duplicate combinations were entered (where C was confused with E). This tidied data imported from excel CSV is displayed below;
| Left Stimulus | Right Stimulus | Selected Stimulus | Combination Stimulus |
|---|---|---|---|
| B | C | C | B C |
| F | D | D | F D |
| A | F | F | A F |
| D | C | C | D C |
| E | F | F | E F |
| D | B | D | D B |
| E | A | A | E A |
| B | A | A | B A |
| C | A | A | C A |
| D | A | D | D A |
| C | B | C | C B |
| C | E | E | C E |
| D | E | E | D E |
| F | B | F | F B |
| E | F | F | E F |
| B | D | D | B D |
| B | F | B | B F |
| E | C | E | E C |
| A | B | A | A B |
| A | E | A | A E |
| F | A | A | F A |
| E | B | E | E B |
| A | C | C | A C |
| B | E | E | B E |
| F | E | E | F E |
| E | D | D | E D |
| A | D | D | A D |
| F | E | E | F E |
| D | E | D | D E |
As these errors constitute valid trials and as the final decision on preference is made on a proportional basis, these errors were left in and not removed. Logistical and time constraints prevented the ideal scenario of a re-attempt of the entire preference assessment.
The number of trials selected is displayed below. The number of times a stimuli was presented is displayed in the 2nd frequency table. To check for left / right bias, the number of right and left selected stimuli was summed. As can be seen below, there is a considerable right hand bias.
frequencySelected.df <- as.data.frame(table(preferenceAssessment.df[,"Selected Stimulus"]),caption = "Frequency table of selected stimuli")
colnames(frequencySelected.df) <- c("Selected Stimulus","Frequency Selected")
kable(frequencySelected.df) %>%
kable_styling("striped", full_width = F)
frequencyAll.df <- as.data.frame(table(preferenceAssessment.df[,"Left Stimulus"])+table(preferenceAssessment.df[,"Right Stimulus"]),caption = "Frequency table of left and right presented stimuli")
colnames(frequencyAll.df) <- c("Stimulus","No. of times presented on left or right")
kable(frequencyAll.df) %>%
kable_styling("striped", full_width = F)
print("Sum of Left Selected Stimuli :"); sum(preferenceAssessment.df[,"Selected Stimulus"] == preferenceAssessment.df[,"Left Stimulus"])
print("Sum of Right Selected Stimuli "); sum(preferenceAssessment.df[,"Selected Stimulus"] == preferenceAssessment.df[,"Right Stimulus"])| Selected Stimulus | Frequency Selected |
|---|---|
| A | 6 |
| B | 1 |
| C | 4 |
| D | 7 |
| E | 7 |
| F | 4 |
| Stimulus | No. of times presented on left or right |
|---|---|
| A | 10 |
| B | 10 |
| C | 7 |
| D | 9 |
| E | 13 |
| F | 9 |
## [1] "Sum of Left Selected Stimuli :"
## [1] 10
## [1] "Sum of Right Selected Stimuli "
## [1] 19
The percentage chosen was calculated by dividing the trials selected by the number of times the stimulus was presented;
dogPercent.df <- as.data.frame(table(preferenceAssessment.df[,"Selected Stimulus"])/(table(preferenceAssessment.df[,"Left Stimulus"])+table(preferenceAssessment.df[,"Right Stimulus"])))
colnames(dogPercent.df) <- c("Stimulus", "Percentage Selected")
kable(dogPercent.df) %>%
kable_styling("striped", full_width = F) %>%
column_spec(1:2, bold = T) %>%
row_spec(4, bold = T, color = "white", background = "#D7261E") %>%
row_spec(1, bold = T, color = "white", background = "#D7831D") %>%
row_spec(2, bold = T, color = "white", background = "#1D93D7")| Stimulus | Percentage Selected |
|---|---|
| A | 0.60 |
| B | 0.10 |
| C | 0.57 |
| D | 0.78 |
| E | 0.54 |
| F | 0.44 |
From this we can see cooked chicken breast was the most preferred option, with meaty rings being second place. Choc treats were the least preferred option. As a balance between cost, preference and practicality, meaty rings will be used as the reinforcer during the next stages of the project. Note that this assignment did not have the ideal equal allocation of trials to all stimuli (as you will note in the unbalanced frequency tables above and as highlighted earlier). Finally, a quick reminder about the mapping of letters to food names;
Foodnames.df <- as.data.frame(c(A="Meaty Rings",B="Choc Treats",C="Salmon and Potato",D="Cooked Chicken Breast",E="Baxters Beef Straps",F="Duck Tenders"))
colnames(Foodnames.df) <- c("Food description")
kable(Foodnames.df) %>%
kable_styling("striped", full_width = F)| Food description | |
|---|---|
| A | Meaty Rings |
| B | Choc Treats |
| C | Salmon and Potato |
| D | Cooked Chicken Breast |
| E | Baxters Beef Straps |
| F | Duck Tenders |