Purpose:

  • This document provides a script for combining and cleaning Qualtrics datasets. The script produces a long-form combined dataset (df_combined_long.csv) and a wide-form dataset (df_combined_wide.csv).

Loading R packages

library(tidyverse)
library(kableExtra)

README

  • Raw datasets are downloaded from Qualtrics and pre-processed before loading. Variables are collected and labeled in this spreadsheet

  • The second row of the raw dataset, which contains the description of variable code in the first row, is removed.

  • Raw datasets are imported to R for processing and cleaning. The first step is to drop (1) participants whose progress is not 100, (2) participants who failed the attention check, (3) participants who used ChatGPT to generate responses, and (4) survey preview. Variables are labeled differently in the raw datasets, so must pay attention. Some datasets have a higher number of attention checkpoints than others.

  • Collect Response IDfor all datasets and Prolific ID if possible. Select all important outcome variables.

  • Create group variable that assigns participants to the control, happy, or beautiful group.

  • Combine datasets into a long-form dataset and a wide-form dataset using Response ID

Data Dictionary

dictionary <- data.frame(variable=c("group",
                                    "response",
                                    "awe",
                                    "time_1",
                                    "time_2",
                                    "weekend_1",
                                    "fss_1",
                                    "fss_2",
                                    "fss_3",
                                    "fss_4",
                                    "fss_5",
                                    "fss_6",
                                    "fss_7",
                                    "life_satisfaction_1",
                                    "life_satisfaction_2",
                                    "life_satisfaction_3",
                                    "life_satisfaction_4",
                                    "life_satisfaction_5",
                                    "psych_1",
                                    "psych_2",
                                    "psych_3",
                                    "psych_4",
                                    "psych_5",
                                    "psych_6",
                                    "psych_7",
                                    "psych_8",
                                    "psych_9",
                                    "psych_10",
                                    "psych_11",
                                    "psych_12",
                                    "psych_13",
                                    "psych_14",
                                    "psych_15",
                                    "psych_16",
                                    "psych_17",
                                    "psych_18",
                                    "time_frozen",
                                    "time_connect",
                                    "time_emotion",
                                    "time_immersed",
                                    "time_authenticity",
                                    "sustain_1",
                                    "sustain_2",
                                    "sustain_3",
                                    "sustain_4",
                                    "sustain_5",
                                    "sustain_6",
                                    "sustain_7",
                                    "sustain_8",
                                    "sustain_9",
                                    "sustain_10",
                                    "sustain_11",
                                    "sustain_12",
                                    "sustain_13",
                                    "sustain_14",
                                    "sustain_15",
                                    "time_done",
                                    "time_slipping",
                                    "time_expand", 
                                    "time_boundless",
                                    "money_1",
                                    "money_2",
                                    "money_3",
                                    "money_4",
                                    "money_5",
                                    "money_6",
                                    "remember_1",
                                    "remember_2",
                                    "minimalism",
                                    "exper_1",
                                    "exper_2",
                                    "exper_3",
                                    "exper_4",
                                    "exper_5",
                                    "exper_6",
                                    "version",
                                    "responseID",
                                    "prolificID"),
                         description=c("control, happy, beautiful",
                                       "text response",
                                       "likert-scale response to the statement 'I felt a sense of awe or wonder as I was recalling the experience.'",
                                       "score response to the question 'How quickly did time seem to pass while you were experiencing the recalled experience?'",
                                       "score response to the question 'How long did the remembered experience feel like it lasted?'",
                                       "How far does this weekend feel?",
                                       "I felt strong and in control.",
                                       "I was completely focused on the task at hand.",
                                       "I felt a sense of timelessness.",
                                       "I felt a deep sense of enjoyment.",
                                       "I was absorbed in what I was doing.",
                                       "I felt a sense of personal accomplishment.",
                                       "I lost awareness of external distractions.",
                                       "In most ways my life is close to my ideal.",
                                       "The conditions of my life are excellent.",
                                       "I am satisfied with my life.",
                                       "So far I have gotten the important things I want in life.",
                                       "If I could live my life over, I would change almost nothing.",
                                       "I like most parts of my personality.",
                                       "When I look at the story of my life, I am pleased with how things have turned out so far.",
                                       "Some people wander aimlessly through life, but I am not one of them.",
                                       "The demands of everyday life often get me down.",
                                       "In many ways I feel disappointed about my achievements in life.",
                                       "Maintaining close relationships has been difficult and frustrating for me.",
                                       "I live life one day at a time and don't really think about the future.",
                                       "In general, I feel I am in charge of the situation in which I live.",
                                       "I am good at managing the responsibilities of my daily life.",
                                       "I sometimes feel as if I've done all there is to do in life.",
                                       "For me, life has been a continuous process of learning, changing, and growth.",
                                       "I think it is important to have new experiences that challenge how I think about myself and the world.",
                                       "People would describe me as a giving person, willing to share my time with others.",
                                       "I gave up trying to make big improvements or changes in my life a long time ago.",
                                       "I tend to be influenced by people with strong opinions.",
                                       "I have not experienced many warm and trusting relationships with others.",
                                       "I have confidence in my own opinions, even if they are different from the way most other people think.",
                                       "I judge myself by what I think is important, not by the values of what others think is important.",
                                       "It felt like time was frozen as I was recalling the experience.",
                                       "I was connected to my own self more than ever as I was recalling the experience.",
                                       "I was having a deeper emotional engagement as I was recalling the experience.",
                                       "I was fully present and immersed in the experience as I was recalling it.",
                                       "I felt a sense of authenticity as I was recalling the experience." ,
                                       "Take showers that are 5 minutes or less.",
                                       "Reuse water bottles for as long as possible.", 
                                       "Prioritize buying durable clothing that emphasizes quality over quantity.",
                                       "Turn off the lights when you leave your home for an extended period.",
                                       "Conserve energy by turning the heat of air conditioner down when you leave the house.",
                                       "Use electronic methods to pay the bills.",
                                       "Read documents online and avoid print-outs as much as possible.",
                                       "Bring your own bag to the grocery store and minimize all single-use plastics.",
                                       "Reduce your food waste.",
                                       "Buy products with less packaging OR more sustainable packaging.",
                                       "Eat more plants and less meat.",
                                       "Donate to conservation organization.",
                                       "Use a bike to go to work/do errands/etc. (If this is a possibility for you).",
                                       "How long does a 5-minute shower feel like?",
                                       "How would you describe the perceived duration or lifespan of the t-shirt you purchase every six months and subsequently discard? Selecting 'Very short' would indicate that you feel the t-shirt should have been used for a longer period, while selecting 'Very long' would suggest that you feel the t-shirt should have been used for a shorter period.",
                                       "I have lots of time in which I can get things done.",
                                       "Time is slipping away.",
                                       "Time is expanded.",
                                       "Time is boundless.",
                                       "There is more to life than money",
                                       "People who chase money often chase away happiness",
                                       "The best things in life are free",
                                       "To get the most of life, people need money",
                                       "Frankly speaking, having money isn’t all that important to me",
                                       "Frankly speaking, having money is something that I value",
                                       "To what extent did you feel immersed during the time you remembered the experience",
                                       "To what extent did you feel engaged during the time you remembered the experience?",
                                       "If we offered you a one-month free subscription to the Mindful Ownership Assistant (MOA), how likely would you be to use it?",
                                       "Imagine that, as a token of our appreciation for your participation, you could select one of two options below to gift to a loved one. Your loved one could be a significant other, friend, family member, or person you admire. Please choose which option you prefer.",
                                       "If my car or vehicle was in need of simple maintenance or upkeep (e.g., it needed to be cleaned, the wiper blades or light bulbs needed to be replaced, or fluids needed to be checked and replenished), I would...",
                                       "If something in my home was in need of repair or improvement (e.g., walls need to be painted, a shower was clogged, there was a hole in the drywall, or my faucet or toilet was leaky), I would...",
                                       "If I was put in charge of organizing an event (e.g., a party, wedding, or fundraiser), I would...",
                                       "If an item of my clothing was ripped or damaged, I would...",
                                       "If I needed to host a dinner party, I would...",
                                       "Dataset name",
                                       "unique identifier for each participant",
                                       "unique identifier for each participant"))
dictionary %>%
  arrange(variable) %>%
  kable("html", col.names = c("Variable", "Description")) %>%
  kable_styling(bootstrap_options = c("striped", "hover")) %>%
  scroll_box(width = "100%", height = "500px")
Variable Description
awe likert-scale response to the statement ‘I felt a sense of awe or wonder as I was recalling the experience.’
exper_1 Imagine that, as a token of our appreciation for your participation, you could select one of two options below to gift to a loved one. Your loved one could be a significant other, friend, family member, or person you admire. Please choose which option you prefer.
exper_2 If my car or vehicle was in need of simple maintenance or upkeep (e.g., it needed to be cleaned, the wiper blades or light bulbs needed to be replaced, or fluids needed to be checked and replenished), I would…
exper_3 If something in my home was in need of repair or improvement (e.g., walls need to be painted, a shower was clogged, there was a hole in the drywall, or my faucet or toilet was leaky), I would…
exper_4 If I was put in charge of organizing an event (e.g., a party, wedding, or fundraiser), I would…
exper_5 If an item of my clothing was ripped or damaged, I would…
exper_6 If I needed to host a dinner party, I would…
fss_1 I felt strong and in control.
fss_2 I was completely focused on the task at hand.
fss_3 I felt a sense of timelessness.
fss_4 I felt a deep sense of enjoyment.
fss_5 I was absorbed in what I was doing.
fss_6 I felt a sense of personal accomplishment.
fss_7 I lost awareness of external distractions.
group control, happy, beautiful
life_satisfaction_1 In most ways my life is close to my ideal.
life_satisfaction_2 The conditions of my life are excellent.
life_satisfaction_3 I am satisfied with my life.
life_satisfaction_4 So far I have gotten the important things I want in life.
life_satisfaction_5 If I could live my life over, I would change almost nothing.
minimalism If we offered you a one-month free subscription to the Mindful Ownership Assistant (MOA), how likely would you be to use it?
money_1 There is more to life than money
money_2 People who chase money often chase away happiness
money_3 The best things in life are free
money_4 To get the most of life, people need money
money_5 Frankly speaking, having money isn’t all that important to me
money_6 Frankly speaking, having money is something that I value
prolificID unique identifier for each participant
psych_1 I like most parts of my personality.
psych_10 I sometimes feel as if I’ve done all there is to do in life.
psych_11 For me, life has been a continuous process of learning, changing, and growth.
psych_12 I think it is important to have new experiences that challenge how I think about myself and the world.
psych_13 People would describe me as a giving person, willing to share my time with others.
psych_14 I gave up trying to make big improvements or changes in my life a long time ago.
psych_15 I tend to be influenced by people with strong opinions.
psych_16 I have not experienced many warm and trusting relationships with others.
psych_17 I have confidence in my own opinions, even if they are different from the way most other people think.
psych_18 I judge myself by what I think is important, not by the values of what others think is important.
psych_2 When I look at the story of my life, I am pleased with how things have turned out so far.
psych_3 Some people wander aimlessly through life, but I am not one of them.
psych_4 The demands of everyday life often get me down.
psych_5 In many ways I feel disappointed about my achievements in life.
psych_6 Maintaining close relationships has been difficult and frustrating for me.
psych_7 I live life one day at a time and don’t really think about the future.
psych_8 In general, I feel I am in charge of the situation in which I live.
psych_9 I am good at managing the responsibilities of my daily life.
remember_1 To what extent did you feel immersed during the time you remembered the experience
remember_2 To what extent did you feel engaged during the time you remembered the experience?
response text response
responseID unique identifier for each participant
sustain_1 Take showers that are 5 minutes or less.
sustain_10 Buy products with less packaging OR more sustainable packaging.
sustain_11 Eat more plants and less meat.
sustain_12 Donate to conservation organization.
sustain_13 Use a bike to go to work/do errands/etc. (If this is a possibility for you).
sustain_14 How long does a 5-minute shower feel like?
sustain_15 How would you describe the perceived duration or lifespan of the t-shirt you purchase every six months and subsequently discard? Selecting ‘Very short’ would indicate that you feel the t-shirt should have been used for a longer period, while selecting ‘Very long’ would suggest that you feel the t-shirt should have been used for a shorter period.
sustain_2 Reuse water bottles for as long as possible.
sustain_3 Prioritize buying durable clothing that emphasizes quality over quantity.
sustain_4 Turn off the lights when you leave your home for an extended period.
sustain_5 Conserve energy by turning the heat of air conditioner down when you leave the house.
sustain_6 Use electronic methods to pay the bills.
sustain_7 Read documents online and avoid print-outs as much as possible.
sustain_8 Bring your own bag to the grocery store and minimize all single-use plastics.
sustain_9 Reduce your food waste.
time_1 score response to the question ‘How quickly did time seem to pass while you were experiencing the recalled experience?’
time_2 score response to the question ‘How long did the remembered experience feel like it lasted?’
time_authenticity I felt a sense of authenticity as I was recalling the experience.
time_boundless Time is boundless.
time_connect I was connected to my own self more than ever as I was recalling the experience.
time_done I have lots of time in which I can get things done.
time_emotion I was having a deeper emotional engagement as I was recalling the experience.
time_expand Time is expanded.
time_frozen It felt like time was frozen as I was recalling the experience.
time_immersed I was fully present and immersed in the experience as I was recalling it.
time_slipping Time is slipping away.
version Dataset name
weekend_1 How far does this weekend feel?

Loading Dataset

Each dataset was downloaded from Qualtrics and manually formatted by removing the second and third rows before importing to R. In each tab, a summary statistics of each dataset is calculated

BeautifulMemories_Prolific_ShareorNo_onequestion

Filtered number of observations

# dropping survey preview and respondents whose progress is not 100 
df1 <- df1 %>% 
  filter(Status=="IP Address") %>%
  filter(Progress==100)
df1 %>% nrow() %>% print()
## [1] 199
df1_clean <- df1 %>%
  select(Q322, ResponseId, Q1026, Q346, Q1009_1,    Q344_1, Q345_1, Q1023_1,    Q1024_1,    Q1025_1) %>%
  mutate(prolific_id=Q322, 
         response_id=ResponseId, 
         happy_response=Q1026, 
         beautiful_response=Q346, 
         happy_share=Q1023_1,
         happy_hear=Q1024_1, 
         happy_imagine=Q1025_1, 
         beautiful_share=Q1009_1,
         beautiful_hear=Q344_1, 
         beautiful_imagine=Q345_1,
         awe = NA,
         time_1 = NA,
         time_2 = NA, 
         weekend_1 = NA,
         fss_1 = NA,
         fss_2 = NA,
         fss_3 = NA,
         fss_4 = NA,
         fss_5 = NA,
         fss_6 = NA,
         fss_7 = NA, 
         life_satisfaction_1 = NA,
         life_satisfaction_2 = NA,
         life_satisfaction_3 = NA,
         life_satisfaction_4 = NA,
         life_satisfaction_5 = NA,
         psych_1 = NA,
         psych_2 = NA,
         psych_3 = NA,
         psych_4 = NA,
         psych_5 = NA,
         psych_6 = NA,
         psych_7 = NA,
         psych_8 = NA,
         psych_9 = NA,
         psych_10 = NA,
         psych_11 = NA,
         psych_12 = NA,
         psych_13 = NA,
         psych_14 = NA,
         psych_15 = NA,
         psych_16 = NA,
         psych_17 = NA,
         psych_18 = NA,
         time_frozen = NA, 
         time_connect = NA, 
         time_emotional = NA, 
         time_immersed = NA, 
         time_authenticity = NA, 
         sustain_1 = NA, 
         sustain_2 = NA,
         sustain_3 = NA,
         sustain_4 = NA, 
         sustain_5 = NA,
         sustain_6 = NA,
         sustain_7 = NA, 
         sustain_8 = NA,
         sustain_9 = NA,
         sustain_10 = NA, 
         sustain_11 = NA,
         sustain_12 = NA,
         sustain_13 = NA, 
         sustain_14 = NA,
         sustain_15 = NA,
         time_done = NA,
         time_slipping = NA,
         time_expand = NA,
         time_boundless = NA,
         money_1 = NA, 
         money_2 = NA,
         money_3 = NA,
         money_4 = NA,
         money_5 = NA,
         money_6 = NA,
         remember_1 = NA, 
         remember_2 = NA, 
         minimalism =NA, 
         exper_1 = NA,
         exper_2 = NA,
         exper_3 = NA,
         exper_4 = NA,
         exper_5 = NA,
         exper_6 = NA
         ) %>%
   mutate(
    beautiful = case_when(
      !is.na(beautiful_response) ~ 1,
      TRUE ~ NA_integer_ 
    ),
    happy = case_when(
      !is.na(happy_response) ~ 1,
      TRUE ~ NA_integer_ 
    )
  ) %>%
  mutate(
    group = case_when(
      !is.na(beautiful) & is.na(happy) ~ "beautiful",
      !is.na(happy) & is.na(beautiful) ~ "happy",
      is.na(beautiful) & is.na(happy) ~ "control"
    )
  )

#$share <- ifelse(is.na(df1_clean$happy_share), df1_clean$beautiful_share, df1_clean$happy_share)
#df1_clean$hear <- ifelse(is.na(df1_clean$happy_hear), df1_clean$beautiful_hear, df1_clean$happy_hear)
#df1_clean$imagine <- ifelse(is.na(df1_clean$happy_imagine), df1_clean$beautiful_imagine, df1_clean$happy_imagine)
df1_clean$response <- ifelse(is.na(df1_clean$happy_response), df1_clean$beautiful_response, df1_clean$happy_response)

df1_clean <- df1_clean %>% 
  select(prolific_id, response_id, group, response, time_1, time_2, awe, weekend_1, fss_1, fss_2, fss_3, fss_4, fss_5, fss_6, fss_7, life_satisfaction_1, life_satisfaction_2, life_satisfaction_3, life_satisfaction_4, life_satisfaction_5, psych_1, psych_2, psych_3, psych_4, psych_5, psych_6, psych_7, psych_8, psych_9, psych_10, psych_11, psych_12, psych_13, psych_14, psych_15, psych_16, psych_17, psych_18, time_frozen, time_connect, time_emotional, time_immersed, time_authenticity, sustain_1, sustain_2, sustain_3, sustain_4, sustain_5, sustain_6, sustain_7, sustain_8, sustain_9, sustain_10, sustain_11, sustain_12, sustain_13, sustain_14, sustain_15, time_done, time_slipping, time_expand, time_boundless, money_1, money_2, money_3, money_4, money_5, money_6, remember_1, remember_2, minimalism, exper_1, exper_2, exper_3, exper_4, exper_5, exper_6) %>% 
  mutate(version="BeautifulMemories_Prolific_ShareorNo_onequestion")

df1_clean %>% count(group) %>%
 kable("html", col.names = c("Group", "Count")) %>%
  kable_styling(bootstrap_options = c("striped", "hover")) %>%
  scroll_box(width = "100%", height = "300px")
Group Count
beautiful 94
happy 105

BeautifulMemories_Prolific_Pilot11_Sustainability

Filtered number of observations

# dropping survey preview, respondents whose progress is not 100, and failed attention check

df2 <- df2 %>% 
  filter(Status=="IP Address") %>%
  filter(Progress==100) %>%
  filter(Q35 =="Moderately Disagree") %>%
  filter(Q43 =="No - I have not used ChatGPT or other sources")
df2 %>% nrow() %>% print()
## [1] 309
df2_clean <- df2 %>%
  select(Q45, ResponseId, Q8, Q12, Q34, Q31_4, Q32_4, Q33, Q15_1, Q16_1, Q17_1, Q18_1, Q19_1, Q20_1, Q21_1, Q22_1, Q23_1, Q24_1, Q25_1, Q26_1, Q27_1, Q28_4, Q29_4, Q36, Q38, Q39, Q40, Q41, Q42) %>%
  
  mutate(prolific_id=Q45, 
         response_id=ResponseId, 
         happy_response=Q12, 
         beautiful_response=Q8, 
         time_1 = Q31_4, 
         time_2 = Q32_4, 
         awe = Q34,
         weekend_1 = NA,
         fss_1 = NA,
         fss_2 = NA,
         fss_3 = NA,
         fss_4 = NA,
         fss_5 = NA,
         fss_6 = NA,
         fss_7 = NA,
         life_satisfaction_1 = NA,
         life_satisfaction_2 = NA,
         life_satisfaction_3 = NA,
         life_satisfaction_4 = NA,
         life_satisfaction_5 = NA,
         psych_1 = NA,
         psych_2 = NA,
         psych_3 = NA,
         psych_4 = NA,
         psych_5 = NA,
         psych_6 = NA,
         psych_7 = NA,
         psych_8 = NA,
         psych_9 = NA,
         psych_10 = NA,
         psych_11 = NA,
         psych_12 = NA,
         psych_13 = NA,
         psych_14 = NA,
         psych_15 = NA,
         psych_16 = NA,
         psych_17 = NA,
         psych_18 = NA,
         time_frozen = Q33, 
         time_connect = NA, 
         time_emotional = NA, 
         time_immersed = NA, 
         time_authenticity = NA,
         sustain_1 = Q15_1, 
         sustain_2 = Q16_1,
         sustain_3 = Q17_1,
         sustain_4 = Q18_1, 
         sustain_5 = Q19_1,
         sustain_6 = Q20_1,
         sustain_7 = Q21_1, 
         sustain_8 = Q22_1,
         sustain_9 = Q23_1,
         sustain_10 = Q24_1, 
         sustain_11 = Q25_1,
         sustain_12 = Q26_1,
         sustain_13 = Q27_1, 
         sustain_14 = Q28_4,
         sustain_15 = Q29_4,
         time_done = NA,
         time_slipping = NA,
         time_expand = NA,
         time_boundless = NA,
         money_1 = NA, 
         money_2 = NA,
         money_3 = NA,
         money_4 = NA,
         money_5 = NA,
         money_6 = NA,
         remember_1 = NA, 
         remember_2 = NA, 
         minimalism =NA, 
         exper_1 = Q36,
         exper_2 = Q38,
         exper_3 = Q39,
         exper_4 = Q40,
         exper_5 = Q41,
         exper_6 = Q42) %>%
   mutate(
    beautiful = case_when(
      !is.na(beautiful_response) ~ 1,
      TRUE ~ NA_integer_ 
    ),
    happy = case_when(
      !is.na(happy_response) ~ 1,
      TRUE ~ NA_integer_ 
    )
  ) %>%
  mutate(
    group = case_when(
      !is.na(beautiful) & is.na(happy) ~ "beautiful",
      !is.na(happy) & is.na(beautiful) ~ "happy",
      is.na(beautiful) & is.na(happy) ~ "control"
    )
  )

df2_clean$response <- ifelse(is.na(df2_clean$happy_response), df2_clean$beautiful_response, df2_clean$happy_response)

df2_clean <- df2_clean %>% 
  select(prolific_id, response_id, group, response, time_1, time_2, awe, weekend_1, fss_1, fss_2, fss_3, fss_4, fss_5, fss_6, fss_7, life_satisfaction_1, life_satisfaction_2, life_satisfaction_3, life_satisfaction_4, life_satisfaction_5, psych_1, psych_2, psych_3, psych_4, psych_5, psych_6, psych_7, psych_8, psych_9, psych_10, psych_11, psych_12, psych_13, psych_14, psych_15, psych_16, psych_17, psych_18, time_frozen, time_connect, time_emotional, time_immersed, time_authenticity, sustain_1, sustain_2, sustain_3, sustain_4, sustain_5, sustain_6, sustain_7, sustain_8, sustain_9, sustain_10, sustain_11, sustain_12, sustain_13, sustain_14, sustain_15, time_done, time_slipping, time_expand, time_boundless, money_1, money_2, money_3, money_4, money_5, money_6, remember_1, remember_2, minimalism, exper_1, exper_2, exper_3, exper_4, exper_5, exper_6) %>% 
  mutate(version="BeautifulMemories_Prolific_Pilot11_Sustainability")

df2_clean %>% count(group) %>%
 kable("html", col.names = c("Group", "Count")) %>%
  kable_styling(bootstrap_options = c("striped", "hover")) %>%
  scroll_box(width = "100%", height = "300px")
Group Count
beautiful 146
happy 163

BeautifulMemories_Prolific_Pilot10_Wellbeing

Filtered number of observations

df3 <- df3 %>%  #dropping survey preview, respondents whose progress is not 100, and failed attention check 
  filter(Status=="IP Address") %>%
  filter(Progress==100) %>% 
  filter(Q46 =="Moderately Disagree") %>%
  filter(Q54 =="No - I have not used ChatGPT or other sources")
df3 %>% nrow %>% print
## [1] 362
df3_clean <- df3 %>%
  select(Q56, ResponseId, Q8, Q12, Q45, Q42_4, Q43_4, Q36, Q37, Q38, Q39, Q40, Q17, Q18, Q19, Q20, Q21, Q22, Q23, Q24, Q25, Q26, Q27, Q28, Q29, Q30, Q31, Q32, Q33, Q34, Q44, Q47, Q49, Q50, Q51, Q52, Q53) %>%
  mutate(prolific_id=Q56, 
         response_id=ResponseId, 
         happy_response=Q12, 
         beautiful_response=Q8,
         awe = Q45,
         time_1 = Q42_4,
         time_2 = Q43_4, 
         weekend_1= NA,
         fss_1 = NA,
         fss_2 = NA,
         fss_3 = NA,
         fss_4 = NA,
         fss_5 = NA,
         fss_6 = NA,
         fss_7 = NA,
         life_satisfaction_1 = Q36,
         life_satisfaction_2 = Q37,
         life_satisfaction_3 = Q38,
         life_satisfaction_4 = Q39,
         life_satisfaction_5 = Q40,
         psych_1 = Q17,
         psych_2 = Q18,
         psych_3 = Q19,
         psych_4 = Q20,
         psych_5 = Q21,
         psych_6 = Q22,
         psych_7 = Q23,
         psych_8 = Q24,
         psych_9 = Q25,
         psych_10 = Q26,
         psych_11 = Q27,
         psych_12 = Q28,
         psych_13 = Q29,
         psych_14 = Q30,
         psych_15 = Q31,
         psych_16 = Q32,
         psych_17 = Q33,
         psych_18 = Q34,
         time_frozen = Q44, 
         time_connect = NA, 
         time_emotional = NA, 
         time_immersed = NA, 
         time_authenticity = NA,
         sustain_1 = NA, 
         sustain_2 = NA,
         sustain_3 = NA,
         sustain_4 = NA, 
         sustain_5 = NA,
         sustain_6 = NA,
         sustain_7 = NA, 
         sustain_8 = NA,
         sustain_9 = NA,
         sustain_10 = NA, 
         sustain_11 = NA,
         sustain_12 = NA,
         sustain_13 = NA, 
         sustain_14 = NA,
         sustain_15 = NA,
         time_done = NA,
         time_slipping = NA,
         time_expand = NA,
         time_boundless = NA,
         money_1 = NA, 
         money_2 = NA,
         money_3 = NA,
         money_4 = NA,
         money_5 = NA,
         money_6 = NA,
         remember_1 = NA, 
         remember_2 = NA, 
         minimalism =NA, 
         exper_1 = Q47,
         exper_2 = Q49,
         exper_3 = Q50,
         exper_4 = Q51,
         exper_5 = Q52,
         exper_6 = Q53) %>%
   mutate(
    beautiful = case_when(
      !is.na(beautiful_response) ~ 1,
      TRUE ~ NA_integer_ 
    ),
    happy = case_when(
      !is.na(happy_response) ~ 1,
      TRUE ~ NA_integer_ 
    )
  ) %>%
  mutate(
    group = case_when(
      !is.na(beautiful) & is.na(happy) ~ "beautiful",
      !is.na(happy) & is.na(beautiful) ~ "happy",
      is.na(beautiful) & is.na(happy) ~ "control"
    )
  )

df3_clean$response <- ifelse(is.na(df3_clean$happy_response), df3_clean$beautiful_response, df3_clean$happy_response)

df3_clean <- df3_clean %>% 
  select(prolific_id, response_id, group, response, time_1, time_2, awe, weekend_1, fss_1, fss_2, fss_3, fss_4, fss_5, fss_6, fss_7, life_satisfaction_1, life_satisfaction_2, life_satisfaction_3, life_satisfaction_4, life_satisfaction_5, psych_1, psych_2, psych_3, psych_4, psych_5, psych_6, psych_7, psych_8, psych_9, psych_10, psych_11, psych_12, psych_13, psych_14, psych_15, psych_16, psych_17, psych_18, time_frozen, time_connect, time_emotional, time_immersed, time_authenticity, sustain_1, sustain_2, sustain_3, sustain_4, sustain_5, sustain_6, sustain_7, sustain_8, sustain_9, sustain_10, sustain_11, sustain_12, sustain_13, sustain_14, sustain_15, time_done, time_slipping, time_expand, time_boundless, money_1, money_2, money_3, money_4, money_5, money_6, remember_1, remember_2, minimalism, exper_1, exper_2, exper_3, exper_4, exper_5, exper_6) %>% 
  mutate(version="BeautifulMemories_Prolific_Pilot10_Wellbeing")

df3_clean %>% count(group) %>%
 kable("html", col.names = c("Group", "Count")) %>%
  kable_styling(bootstrap_options = c("striped", "hover")) %>%
  scroll_box(width = "100%", height = "300px")
Group Count
beautiful 174
happy 188

07_Beauty_3conditionspilot_withoutphotos

Filtered number of observations

df4 <- df4 %>% 
  filter(Status=="IP Address") %>%
  filter(Progress==100) 
df4 %>% nrow %>% print
## [1] 241
df4_clean <- df4 %>%
  select(ResponseId, Q7, Q13, Q313, Q272_4, Q273_4, Q287_1, Q310...43, Q317, Q311, Q312, Q319, Q316_1) %>%
  mutate(prolific_id=NA, 
         response_id=ResponseId, 
         happy_response=Q13, 
         beautiful_response=Q7,
         awe = Q313,
         time_1 = Q272_4,
         time_2 = Q273_4,
         weekend_1 = Q287_1,
         fss_1 = NA,
         fss_2 = NA,
         fss_3 = NA,
         fss_4 = NA,
         fss_5 = NA,
         fss_6 = NA,
         fss_7 = NA,
         life_satisfaction_1 = NA,
         life_satisfaction_2 = NA,
         life_satisfaction_3 = NA,
         life_satisfaction_4 = NA,
         life_satisfaction_5 = NA,
         psych_1 = NA,
         psych_2 = NA,
         psych_3 = NA,
         psych_4 = NA,
         psych_5 = NA,
         psych_6 = NA,
         psych_7 = NA,
         psych_8 = NA,
         psych_9 = NA,
         psych_10 = NA,
         psych_11 = NA,
         psych_12 = NA,
         psych_13 = NA,
         psych_14 = NA,
         psych_15 = NA,
         psych_16 = NA,
         psych_17 = NA,
         psych_18 = NA,
         time_frozen = Q310...43, 
         time_connect = Q317, 
         time_emotional = Q311, 
         time_immersed = Q312, 
         time_authenticity = Q319,
         sustain_1 = NA, 
         sustain_2 = NA,
         sustain_3 = NA,
         sustain_4 = NA, 
         sustain_5 = NA,
         sustain_6 = NA,
         sustain_7 = NA, 
         sustain_8 = NA,
         sustain_9 = NA,
         sustain_10 = NA, 
         sustain_11 = NA,
         sustain_12 = NA,
         sustain_13 = NA, 
         sustain_14 = NA,
         sustain_15 = NA,
         time_done = NA,
         time_slipping = NA,
         time_expand = NA,
         time_boundless = NA,
         money_1 = NA, 
         money_2 = NA,
         money_3 = NA,
         money_4 = NA,
         money_5 = NA,
         money_6 = NA,
         remember_1 = NA, 
         remember_2 = NA, 
         minimalism =Q316_1, 
         exper_1 = NA,
         exper_2 = NA,
         exper_3 = NA,
         exper_4 = NA,
         exper_5 = NA,
         exper_6 = NA) %>%
   mutate(
    beautiful = case_when(
      !is.na(beautiful_response) ~ 1,
      TRUE ~ NA_integer_ 
    ),
    happy = case_when(
      !is.na(happy_response) ~ 1,
      TRUE ~ NA_integer_ 
    )
  ) %>%
  mutate(
    group = case_when(
      !is.na(beautiful) & is.na(happy) ~ "beautiful",
      !is.na(happy) & is.na(beautiful) ~ "happy",
      is.na(beautiful) & is.na(happy) ~ "control"
    )
  )


df4_clean$response <- ifelse(is.na(df4_clean$happy_response), df4_clean$beautiful_response, df4_clean$happy_response)


df4_clean <- df4_clean %>% 
  select(prolific_id, response_id, group, response, time_1, time_2, awe, weekend_1, fss_1, fss_2, fss_3, fss_4, fss_5, fss_6, fss_7, life_satisfaction_1, life_satisfaction_2, life_satisfaction_3, life_satisfaction_4, life_satisfaction_5, psych_1, psych_2, psych_3, psych_4, psych_5, psych_6, psych_7, psych_8, psych_9, psych_10, psych_11, psych_12, psych_13, psych_14, psych_15, psych_16, psych_17, psych_18, time_frozen, time_connect, time_emotional, time_immersed, time_authenticity, sustain_1, sustain_2, sustain_3, sustain_4, sustain_5, sustain_6, sustain_7, sustain_8, sustain_9, sustain_10, sustain_11, sustain_12, sustain_13, sustain_14, sustain_15, time_done, time_slipping, time_expand, time_boundless, money_1, money_2, money_3, money_4, money_5, money_6, remember_1, remember_2, minimalism, exper_1, exper_2, exper_3, exper_4, exper_5, exper_6) %>% 
  mutate(version="07_Beauty_3conditionspilot_withoutphotos")

Beauty_3conditionspilot_withoutphotos_SONA

Filtered number of observations

df5 <- df5 %>% 
  filter(Status=="IP Address") %>%
  filter(Progress==100)
df5 %>% nrow %>% print
## [1] 47
df5_clean <- df5 %>%
  select(ResponseId, Q7, Q13, Q272_4, Q273_4, Q19, Q287_1, Q292, Q284, Q285, Q286, Q921_4, Q269_4) %>%
  mutate(prolific_id=NA, 
         response_id=ResponseId, 
         happy_response=Q13, 
         beautiful_response=Q7,
         control_response=Q19,
         awe = NA,
         time_1 = Q272_4,
         time_2 = Q273_4,
         weekend_1= Q287_1,
         fss_1 = NA,
         fss_2 = NA,
         fss_3 = NA,
         fss_4 = NA,
         fss_5 = NA,
         fss_6 = NA,
         fss_7 = NA,
         life_satisfaction_1 = NA,
         life_satisfaction_2 = NA,
         life_satisfaction_3 = NA,
         life_satisfaction_4 = NA,
         life_satisfaction_5 = NA,
         psych_1 = NA,
         psych_2 = NA,
         psych_3 = NA,
         psych_4 = NA,
         psych_5 = NA,
         psych_6 = NA,
         psych_7 = NA,
         psych_8 = NA,
         psych_9 = NA,
         psych_10 = NA,
         psych_11 = NA,
         psych_12 = NA,
         psych_13 = NA,
         psych_14 = NA,
         psych_15 = NA,
         psych_16 = NA,
         psych_17 = NA,
         psych_18 = NA,
         time_frozen = NA, 
         time_connect = NA, 
         time_emotional = NA, 
         time_immersed = NA, 
         time_authenticity = NA,
         sustain_1 = NA, 
         sustain_2 = NA,
         sustain_3 = NA,
         sustain_4 = NA, 
         sustain_5 = NA,
         sustain_6 = NA,
         sustain_7 = NA, 
         sustain_8 = NA,
         sustain_9 = NA,
         sustain_10 = NA, 
         sustain_11 = NA,
         sustain_12 = NA,
         sustain_13 = NA, 
         sustain_14 = NA,
         sustain_15 = NA,
         time_done = Q292,
         time_slipping = Q284,
         time_expand = Q285,
         time_boundless = Q286,
         money_1 = NA, 
         money_2 = NA,
         money_3 = NA,
         money_4 = NA,
         money_5 = NA,
         money_6 = NA,
         remember_1 = Q921_4, 
         remember_2 = Q269_4, 
         minimalism =NA, 
         exper_1 = NA,
         exper_2 = NA,
         exper_3 = NA,
         exper_4 = NA,
         exper_5 = NA,
         exper_6 = NA) %>%
   mutate(
    beautiful = case_when(
      !is.na(beautiful_response) ~ 1,
      TRUE ~ NA_integer_ 
    ),
    happy = case_when(
      !is.na(happy_response) ~ 1,
      TRUE ~ NA_integer_ 
    )
  ) %>%
  mutate(
    group = case_when(
      !is.na(beautiful) & is.na(happy) ~ "beautiful",
      !is.na(happy) & is.na(beautiful) ~ "happy",
      is.na(beautiful) & is.na(happy) ~ "control"
    )
  )

df5_clean$response <- ifelse(is.na(df5_clean$happy_response), ifelse(is.na(df5_clean$beautiful_response), df5_clean$control_response, df5_clean$beautiful_response), df5_clean$happy_response)


df5_clean <- df5_clean %>% 
  select(prolific_id, response_id, group, response, time_1, time_2, awe, weekend_1, fss_1, fss_2, fss_3, fss_4, fss_5, fss_6, fss_7, life_satisfaction_1, life_satisfaction_2, life_satisfaction_3, life_satisfaction_4, life_satisfaction_5, psych_1, psych_2, psych_3, psych_4, psych_5, psych_6, psych_7, psych_8, psych_9, psych_10, psych_11, psych_12, psych_13, psych_14, psych_15, psych_16, psych_17, psych_18, time_frozen, time_connect, time_emotional, time_immersed, time_authenticity, sustain_1, sustain_2, sustain_3, sustain_4, sustain_5, sustain_6, sustain_7, sustain_8, sustain_9, sustain_10, sustain_11, sustain_12, sustain_13, sustain_14, sustain_15, time_done, time_slipping, time_expand, time_boundless, money_1, money_2, money_3, money_4, money_5, money_6, remember_1, remember_2, minimalism, exper_1, exper_2, exper_3, exper_4, exper_5, exper_6) %>% 
  mutate(version="Beauty_3conditionspilot_withoutphotos_SONA")

Beauty_3conditionspilot_withoutphotos_SIM_Replicate

Filtered number of observations

df6 <- df6 %>% 
  filter(Status=="IP Address") %>%
  filter(Progress==100)
df6 %>% nrow %>% print
## [1] 207
df6_clean <- df6 %>%
  select(ResponseId, Q7, Q13, Q272_4, Q273_4, Q313, Q287_1, Q310...43, Q317, Q311, Q312, Q319, Q316_1) %>%
  mutate(prolific_id=NA, 
         response_id=ResponseId, 
         happy_response=Q13, 
         beautiful_response=Q7,
         awe = Q313,
         time_1 = Q272_4,
         time_2 = Q273_4,
         weekend_1 = Q287_1,
         fss_1 = NA,
         fss_2 = NA,
         fss_3 = NA,
         fss_4 = NA,
         fss_5 = NA,
         fss_6 = NA,
         fss_7 = NA,
         life_satisfaction_1 = NA,
         life_satisfaction_2 = NA,
         life_satisfaction_3 = NA,
         life_satisfaction_4 = NA,
         life_satisfaction_5 = NA,
         psych_1 = NA,
         psych_2 = NA,
         psych_3 = NA,
         psych_4 = NA,
         psych_5 = NA,
         psych_6 = NA,
         psych_7 = NA,
         psych_8 = NA,
         psych_9 = NA,
         psych_10 = NA,
         psych_11 = NA,
         psych_12 = NA,
         psych_13 = NA,
         psych_14 = NA,
         psych_15 = NA,
         psych_16 = NA,
         psych_17 = NA,
         psych_18 = NA,
         time_frozen = Q310...43, 
         time_connect = Q317, 
         time_emotional = Q311, 
         time_immersed = Q312, 
         time_authenticity = Q319,
         sustain_1 = NA, 
         sustain_2 = NA,
         sustain_3 = NA,
         sustain_4 = NA, 
         sustain_5 = NA,
         sustain_6 = NA,
         sustain_7 = NA, 
         sustain_8 = NA,
         sustain_9 = NA,
         sustain_10 = NA, 
         sustain_11 = NA,
         sustain_12 = NA,
         sustain_13 = NA, 
         sustain_14 = NA,
         sustain_15 = NA,
         time_done = NA,
         time_slipping = NA,
         time_expand = NA,
         time_boundless = NA,
         money_1 = NA, 
         money_2 = NA,
         money_3 = NA,
         money_4 = NA,
         money_5 = NA,
         money_6 = NA,
         remember_1 = NA, 
         remember_2 = NA, 
         minimalism =Q316_1, 
         exper_1 = NA,
         exper_2 = NA,
         exper_3 = NA,
         exper_4 = NA,
         exper_5 = NA,
         exper_6 = NA) %>%
   mutate(
    beautiful = case_when(
      !is.na(beautiful_response) ~ 1,
      TRUE ~ NA_integer_ 
    ),
    happy = case_when(
      !is.na(happy_response) ~ 1,
      TRUE ~ NA_integer_ 
    )
  ) %>%
  mutate(
    group = case_when(
      !is.na(beautiful) & is.na(happy) ~ "beautiful",
      !is.na(happy) & is.na(beautiful) ~ "happy",
      is.na(beautiful) & is.na(happy) ~ "control"
    )
  )

df6_clean$response <- ifelse(is.na(df6_clean$happy_response), df6_clean$beautiful_response, df6_clean$happy_response)
df6_clean <- df6_clean %>% 
  select(prolific_id, response_id, group, response, time_1, time_2, awe, weekend_1, fss_1, fss_2, fss_3, fss_4, fss_5, fss_6, fss_7, life_satisfaction_1, life_satisfaction_2, life_satisfaction_3, life_satisfaction_4, life_satisfaction_5, psych_1, psych_2, psych_3, psych_4, psych_5, psych_6, psych_7, psych_8, psych_9, psych_10, psych_11, psych_12, psych_13, psych_14, psych_15, psych_16, psych_17, psych_18, time_frozen, time_connect, time_emotional, time_immersed, time_authenticity, sustain_1, sustain_2, sustain_3, sustain_4, sustain_5, sustain_6, sustain_7, sustain_8, sustain_9, sustain_10, sustain_11, sustain_12, sustain_13, sustain_14, sustain_15, time_done, time_slipping, time_expand, time_boundless, money_1, money_2, money_3, money_4, money_5, money_6, remember_1, remember_2, minimalism, exper_1, exper_2, exper_3, exper_4, exper_5, exper_6) %>% 
  mutate(version="Beauty_3conditionspilot_withoutphotos_SIM_Replicate")

Beauty_3conditionspilot_withoutphotos_SIM_prompt_but_money

Filtered number of observations

df7 <- df7 %>% 
  filter(Status=="IP Address") %>%
  filter(Progress==100) %>%
  filter(Q350=="Strongly Disagree")
df7_clean <- df7 %>%
  select(ResponseId, Q7, Q13, Q272_4, Q273_4, Q313, Q310, Q317, Q311, Q312, Q336, Q337, Q338, Q339, Q340, Q345) %>%
  mutate(prolific_id=NA, 
         response_id=ResponseId, 
         happy_response=Q13, 
         beautiful_response=Q7,
         awe = Q313,
         time_1 = Q272_4,
         time_2 = Q273_4, 
         weekend_1= NA,
         fss_1 = NA,
         fss_2 = NA,
         fss_3 = NA,
         fss_4 = NA,
         fss_5 = NA,
         fss_6 = NA,
         fss_7 = NA,
         life_satisfaction_1 = NA,
         life_satisfaction_2 = NA,
         life_satisfaction_3 = NA,
         life_satisfaction_4 = NA,
         life_satisfaction_5 = NA,
         psych_1 = NA,
         psych_2 = NA,
         psych_3 = NA,
         psych_4 = NA,
         psych_5 = NA,
         psych_6 = NA,
         psych_7 = NA,
         psych_8 = NA,
         psych_9 = NA,
         psych_10 = NA,
         psych_11 = NA,
         psych_12 = NA,
         psych_13 = NA,
         psych_14 = NA,
         psych_15 = NA,
         psych_16 = NA,
         psych_17 = NA,
         psych_18 = NA,
         time_frozen = Q310, 
         time_connect = Q317, 
         time_emotional = Q311, 
         time_immersed = Q312, 
         time_authenticity = NA,
        sustain_1 = NA, 
         sustain_2 = NA,
         sustain_3 = NA,
         sustain_4 = NA, 
         sustain_5 = NA,
         sustain_6 = NA,
         sustain_7 = NA, 
         sustain_8 = NA,
         sustain_9 = NA,
         sustain_10 = NA, 
         sustain_11 = NA,
         sustain_12 = NA,
         sustain_13 = NA, 
         sustain_14 = NA,
         sustain_15 = NA,
         time_done = NA,
         time_slipping = NA,
         time_expand = NA,
         time_boundless = NA,
         money_1 = Q336, 
         money_2 = Q337,
         money_3 = Q338,
         money_4 = Q339,
         money_5 = Q340,
         money_6 = Q345,
         remember_1 = NA, 
         remember_2 = NA, 
         minimalism =NA, 
         exper_1 = NA,
         exper_2 = NA,
         exper_3 = NA,
         exper_4 = NA,
         exper_5 = NA,
         exper_6 = NA) %>%
   mutate(
    beautiful = case_when(
      !is.na(beautiful_response) ~ 1,
      TRUE ~ NA_integer_ 
    ),
    happy = case_when(
      !is.na(happy_response) ~ 1,
      TRUE ~ NA_integer_ 
    )
  ) %>%
  mutate(
    group = case_when(
      !is.na(beautiful) & is.na(happy) ~ "beautiful",
      !is.na(happy) & is.na(beautiful) ~ "happy",
      is.na(beautiful) & is.na(happy) ~ "control"
    )
  )

df7_clean$response <- ifelse(is.na(df7_clean$happy_response), df7_clean$beautiful_response, df7_clean$happy_response)

df7_clean <- df7_clean %>% 
  select(prolific_id, response_id, group, response, time_1, time_2, awe, weekend_1, fss_1, fss_2, fss_3, fss_4, fss_5, fss_6, fss_7, life_satisfaction_1, life_satisfaction_2, life_satisfaction_3, life_satisfaction_4, life_satisfaction_5, psych_1, psych_2, psych_3, psych_4, psych_5, psych_6, psych_7, psych_8, psych_9, psych_10, psych_11, psych_12, psych_13, psych_14, psych_15, psych_16, psych_17, psych_18, time_frozen, time_connect, time_emotional, time_immersed, time_authenticity, sustain_1, sustain_2, sustain_3, sustain_4, sustain_5, sustain_6, sustain_7, sustain_8, sustain_9, sustain_10, sustain_11, sustain_12, sustain_13, sustain_14, sustain_15, time_done, time_slipping, time_expand, time_boundless, money_1, money_2, money_3, money_4, money_5, money_6, remember_1, remember_2, minimalism, exper_1, exper_2, exper_3, exper_4, exper_5, exper_6) %>% 
  mutate(version="Beauty_3conditionspilot_withoutphotos_SIM_prompt_but_money")

Beauty_3conditionspilot_withoutphotos_Pilot4.csv

Filtered number of observations

df8 <- df8 %>% 
  filter(Status=="IP Address") %>%
  filter(Progress==100) %>%
  slice(-(1:3)) # dropping RA test responses
df8_clean <- df8 %>%
  select(ResponseId, Q7, Q13, Q19, Q272_4, Q273_4, Q313, Q288, Q287_1, Q310...45, Q317, Q311, Q312, Q319, Q316_1) %>%
  mutate(prolific_id=Q288, 
         response_id=ResponseId, 
         happy_response=Q13, 
         beautiful_response=Q7,
         control_response=Q19,
         awe = Q313,
         time_1 = Q272_4,
         time_2 = Q273_4,
         weekend_1 = Q287_1,
         fss_1 = NA,
         fss_2 = NA,
         fss_3 = NA,
         fss_4 = NA,
         fss_5 = NA,
         fss_6 = NA,
         fss_7 = NA,
         life_satisfaction_1 = NA,
         life_satisfaction_2 = NA,
         life_satisfaction_3 = NA,
         life_satisfaction_4 = NA,
         life_satisfaction_5 = NA,
         psych_1 = NA,
         psych_2 = NA,
         psych_3 = NA,
         psych_4 = NA,
         psych_5 = NA,
         psych_6 = NA,
         psych_7 = NA,
         psych_8 = NA,
         psych_9 = NA,
         psych_10 = NA,
         psych_11 = NA,
         psych_12 = NA,
         psych_13 = NA,
         psych_14 = NA,
         psych_15 = NA,
         psych_16 = NA,
         psych_17 = NA,
         psych_18 = NA,
         time_frozen = Q310...45, 
         time_connect = Q317, 
         time_emotional = Q311, 
         time_immersed = Q312, 
         time_authenticity = Q319,
         sustain_1 = NA, 
         sustain_2 = NA,
         sustain_3 = NA,
         sustain_4 = NA, 
         sustain_5 = NA,
         sustain_6 = NA,
         sustain_7 = NA, 
         sustain_8 = NA,
         sustain_9 = NA,
         sustain_10 = NA, 
         sustain_11 = NA,
         sustain_12 = NA,
         sustain_13 = NA, 
         sustain_14 = NA,
         sustain_15 = NA,
         time_done = NA,
         time_slipping = NA,
         time_expand = NA,
         time_boundless = NA,
         money_1 = NA, 
         money_2 = NA,
         money_3 = NA,
         money_4 = NA,
         money_5 = NA,
         money_6 = NA,
         remember_1 = NA, 
         remember_2 = NA, 
         minimalism =Q316_1, 
         exper_1 = NA,
         exper_2 = NA,
         exper_3 = NA,
         exper_4 = NA,
         exper_5 = NA,
         exper_6 = NA) %>%
   mutate(
    beautiful = case_when(
      !is.na(beautiful_response) ~ 1,
      TRUE ~ NA_integer_ 
    ),
    happy = case_when(
      !is.na(happy_response) ~ 1,
      TRUE ~ NA_integer_ 
    )
  ) %>%
  mutate(
    group = case_when(
      !is.na(beautiful) & is.na(happy) ~ "beautiful",
      !is.na(happy) & is.na(beautiful) ~ "happy",
      is.na(beautiful) & is.na(happy) ~ "control"
    )
  )

df8_clean$response <- ifelse(is.na(df8_clean$happy_response), ifelse(is.na(df8_clean$beautiful_response), df8_clean$control_response, df8_clean$beautiful_response), df8_clean$happy_response)

df8_clean <- df8_clean %>% 
  select(prolific_id, response_id, group, response, time_1, time_2, awe, weekend_1, fss_1, fss_2, fss_3, fss_4, fss_5, fss_6, fss_7, life_satisfaction_1, life_satisfaction_2, life_satisfaction_3, life_satisfaction_4, life_satisfaction_5, psych_1, psych_2, psych_3, psych_4, psych_5, psych_6, psych_7, psych_8, psych_9, psych_10, psych_11, psych_12, psych_13, psych_14, psych_15, psych_16, psych_17, psych_18, time_frozen, time_connect, time_emotional, time_immersed, time_authenticity, sustain_1, sustain_2, sustain_3, sustain_4, sustain_5, sustain_6, sustain_7, sustain_8, sustain_9, sustain_10, sustain_11, sustain_12, sustain_13, sustain_14, sustain_15, time_done, time_slipping, time_expand, time_boundless, money_1, money_2, money_3, money_4, money_5, money_6, remember_1, remember_2, minimalism, exper_1, exper_2, exper_3, exper_4, exper_5, exper_6) %>% 
  mutate(version="Beauty_3conditionspilot_withoutphotos_Pilot4")

Beauty_3conditionspilot_withoutphotos_Experiential_pilot_0

Filtered number of observations

df9 <- df9 %>% 
  filter(Status=="IP Address") %>%
  filter(Progress==100) %>%
  filter(Q319 =="Moderately Disagree")
df9_clean <- df9 %>%
  select(ResponseId, Q7, Q13, Q19, Q272_4, Q273_4, Q313, Q1009, Q1010, Q1011, Q1012, Q1013, Q1014, Q339, Q310...58, Q317, Q311, Q312, Q319, Q330, Q325, Q326, Q327, Q328, Q329) %>%
  mutate(prolific_id=NA, 
         response_id=ResponseId, 
         happy_response=Q13, 
         beautiful_response=Q7,
         control_response=Q19,
         awe = Q313,
         time_1 = Q272_4,
         time_2 = Q273_4,
         weekend_1 = NA,
         fss_1 = Q1009,
         fss_2 = Q1010,
         fss_3 = Q1011,
         fss_4 = Q1012,
         fss_5 = Q1013,
         fss_6 = Q1014,
         fss_7 = Q339,
         life_satisfaction_1 = NA,
         life_satisfaction_2 = NA,
         life_satisfaction_3 = NA,
         life_satisfaction_4 = NA,
         life_satisfaction_5 = NA,
         psych_1 = NA,
         psych_2 = NA,
         psych_3 = NA,
         psych_4 = NA,
         psych_5 = NA,
         psych_6 = NA,
         psych_7 = NA,
         psych_8 = NA,
         psych_9 = NA,
         psych_10 = NA,
         psych_11 = NA,
         psych_12 = NA,
         psych_13 = NA,
         psych_14 = NA,
         psych_15 = NA,
         psych_16 = NA,
         psych_17 = NA,
         psych_18 = NA,
         time_frozen = Q310...58, 
         time_connect = Q317, 
         time_emotional = Q311, 
         time_immersed = Q312, 
         time_authenticity = Q319,
         sustain_1 = NA, 
         sustain_2 = NA,
         sustain_3 = NA,
         sustain_4 = NA, 
         sustain_5 = NA,
         sustain_6 = NA,
         sustain_7 = NA, 
         sustain_8 = NA,
         sustain_9 = NA,
         sustain_10 = NA, 
         sustain_11 = NA,
         sustain_12 = NA,
         sustain_13 = NA, 
         sustain_14 = NA,
         sustain_15 = NA,
         time_done = NA,
         time_slipping = NA,
         time_expand = NA,
         time_boundless = NA,
         money_1 = NA, 
         money_2 = NA,
         money_3 = NA,
         money_4 = NA,
         money_5 = NA,
         money_6 = NA,
         remember_1 = NA, 
         remember_2 = NA, 
         minimalism =NA, 
         exper_1 = Q330,
         exper_2 = Q325,
         exper_3 = Q326,
         exper_4 = Q327,
         exper_5 = Q328,
         exper_6 = Q329) %>%
   mutate(
    beautiful = case_when(
      !is.na(beautiful_response) ~ 1,
      TRUE ~ NA_integer_ 
    ),
    happy = case_when(
      !is.na(happy_response) ~ 1,
      TRUE ~ NA_integer_ 
    )
  ) %>%
  mutate(
    group = case_when(
      !is.na(beautiful) & is.na(happy) ~ "beautiful",
      !is.na(happy) & is.na(beautiful) ~ "happy",
      is.na(beautiful) & is.na(happy) ~ "control"
    )
  )
df9_clean$response <- ifelse(is.na(df9_clean$happy_response), ifelse(is.na(df9_clean$beautiful_response), df9_clean$control_response, df9_clean$beautiful_response), df9_clean$happy_response)

df9_clean <- df9_clean %>% 
  select(prolific_id, response_id, group, response, time_1, time_2, awe, weekend_1, fss_1, fss_2, fss_3, fss_4, fss_5, fss_6, fss_7, life_satisfaction_1, life_satisfaction_2, life_satisfaction_3, life_satisfaction_4, life_satisfaction_5, psych_1, psych_2, psych_3, psych_4, psych_5, psych_6, psych_7, psych_8, psych_9, psych_10, psych_11, psych_12, psych_13, psych_14, psych_15, psych_16, psych_17, psych_18, time_frozen, time_connect, time_emotional, time_immersed, time_authenticity, sustain_1, sustain_2, sustain_3, sustain_4, sustain_5, sustain_6, sustain_7, sustain_8, sustain_9, sustain_10, sustain_11, sustain_12, sustain_13, sustain_14, sustain_15, time_done, time_slipping, time_expand, time_boundless, money_1, money_2, money_3, money_4, money_5, money_6, remember_1, remember_2, minimalism, exper_1, exper_2, exper_3, exper_4, exper_5, exper_6) %>% 
  mutate(version="Beauty_3conditionspilot_withoutphotos_Experiential_pilot_0")

Beauty_3conditionspilot_withoutphotos

Filtered number of observations

df10 <- df10 %>% 
  filter(Status=="IP Address") %>%
  filter(Progress==100)
df10_clean <- df10 %>%
  select(ResponseId, Q7, Q13, Q19, Q272_4, Q273_4, Q288, Q287_1, Q292, Q284, Q285, Q286, Q921_4, Q269_4) %>%
  mutate(prolific_id=Q288, 
         response_id=ResponseId, 
         happy_response=Q13, 
         beautiful_response=Q7,
         control_response=Q19,
         awe = NA,
         time_1 = Q272_4,
         time_2 = Q273_4,
         weekend_1 = Q287_1,
         fss_1 = NA,
         fss_2 = NA,
         fss_3 = NA,
         fss_4 = NA,
         fss_5 = NA,
         fss_6 = NA,
         fss_7 = NA,
         life_satisfaction_1 = NA,
         life_satisfaction_2 = NA,
         life_satisfaction_3 = NA,
         life_satisfaction_4 = NA,
         life_satisfaction_5 = NA,
         psych_1 = NA,
         psych_2 = NA,
         psych_3 = NA,
         psych_4 = NA,
         psych_5 = NA,
         psych_6 = NA,
         psych_7 = NA,
         psych_8 = NA,
         psych_9 = NA,
         psych_10 = NA,
         psych_11 = NA,
         psych_12 = NA,
         psych_13 = NA,
         psych_14 = NA,
         psych_15 = NA,
         psych_16 = NA,
         psych_17 = NA,
         psych_18 = NA,
         time_frozen = NA, 
         time_connect = NA, 
         time_emotional = NA, 
         time_immersed = NA, 
         time_authenticity = NA,
         sustain_1 = NA, 
         sustain_2 = NA,
         sustain_3 = NA,
         sustain_4 = NA, 
         sustain_5 = NA,
         sustain_6 = NA,
         sustain_7 = NA, 
         sustain_8 = NA,
         sustain_9 = NA,
         sustain_10 = NA, 
         sustain_11 = NA,
         sustain_12 = NA,
         sustain_13 = NA, 
         sustain_14 = NA,
         sustain_15 = NA,
         time_done = Q292,
         time_slipping = Q284,
         time_expand = Q285,
         time_boundless = Q286,
         money_1 = NA, 
         money_2 = NA,
         money_3 = NA,
         money_4 = NA,
         money_5 = NA,
         money_6 = NA,
         remember_1 = Q921_4, 
         remember_2 = Q269_4, 
         minimalism =NA, 
         exper_1 = NA,
         exper_2 = NA,
         exper_3 = NA,
         exper_4 = NA,
         exper_5 = NA,
         exper_6 = NA) %>%
   mutate(
    beautiful = case_when(
      !is.na(beautiful_response) ~ 1,
      TRUE ~ NA_integer_ 
    ),
    happy = case_when(
      !is.na(happy_response) ~ 1,
      TRUE ~ NA_integer_ 
    )
  ) %>%
  mutate(
    group = case_when(
      !is.na(beautiful) & is.na(happy) ~ "beautiful",
      !is.na(happy) & is.na(beautiful) ~ "happy",
      is.na(beautiful) & is.na(happy) ~ "control"
    )
  )
df10_clean$response <- ifelse(is.na(df10_clean$happy_response), ifelse(is.na(df10_clean$beautiful_response), df10_clean$control_response, df10_clean$beautiful_response), df10_clean$happy_response)
df10_clean <- df10_clean %>% 
  select(prolific_id, response_id, group, response, time_1, time_2, awe, weekend_1, fss_1, fss_2, fss_3, fss_4, fss_5, fss_6, fss_7, life_satisfaction_1, life_satisfaction_2, life_satisfaction_3, life_satisfaction_4, life_satisfaction_5, psych_1, psych_2, psych_3, psych_4, psych_5, psych_6, psych_7, psych_8, psych_9, psych_10, psych_11, psych_12, psych_13, psych_14, psych_15, psych_16, psych_17, psych_18, time_frozen, time_connect, time_emotional, time_immersed, time_authenticity, sustain_1, sustain_2, sustain_3, sustain_4, sustain_5, sustain_6, sustain_7, sustain_8, sustain_9, sustain_10, sustain_11, sustain_12, sustain_13, sustain_14, sustain_15, time_done, time_slipping, time_expand, time_boundless, money_1, money_2, money_3, money_4, money_5, money_6, remember_1, remember_2, minimalism, exper_1, exper_2, exper_3, exper_4, exper_5, exper_6) %>% 
  mutate(version="Beauty_3conditionspilot_withoutphotos")

BeautifulMemories_Prolific_Pilot13_ITC

Filtered number of observations

df11 <- df11 %>% 
  filter(Status=="IP Address") %>%
  filter(Progress==100) %>%
  filter(Q54 == "No - I have not used ChatGPT or other sources") %>%
  filter(Q46 == "Moderately Disagree")
df11_clean <- df11 %>%
  select(ResponseId, Q8, Q12, Q42_4, Q43_4, PROLIFIC_PID) %>%
  mutate(prolific_id=PROLIFIC_PID, 
         response_id=ResponseId, 
         happy_response=Q12, 
         beautiful_response=Q8,
         control_response=NA,
         awe = NA,
         time_1 = Q42_4,
         time_2 = Q43_4,
         weekend_1 = NA,
         fss_1 = NA,
         fss_2 = NA,
         fss_3 = NA,
         fss_4 = NA,
         fss_5 = NA,
         fss_6 = NA,
         fss_7 = NA,
         life_satisfaction_1 = NA,
         life_satisfaction_2 = NA,
         life_satisfaction_3 = NA,
         life_satisfaction_4 = NA,
         life_satisfaction_5 = NA,
         psych_1 = NA,
         psych_2 = NA,
         psych_3 = NA,
         psych_4 = NA,
         psych_5 = NA,
         psych_6 = NA,
         psych_7 = NA,
         psych_8 = NA,
         psych_9 = NA,
         psych_10 = NA,
         psych_11 = NA,
         psych_12 = NA,
         psych_13 = NA,
         psych_14 = NA,
         psych_15 = NA,
         psych_16 = NA,
         psych_17 = NA,
         psych_18 = NA,
         time_frozen = NA, 
         time_connect = NA, 
         time_emotional = NA, 
         time_immersed = NA, 
         time_authenticity = NA,
         sustain_1 = NA, 
         sustain_2 = NA,
         sustain_3 = NA,
         sustain_4 = NA, 
         sustain_5 = NA,
         sustain_6 = NA,
         sustain_7 = NA, 
         sustain_8 = NA,
         sustain_9 = NA,
         sustain_10 = NA, 
         sustain_11 = NA,
         sustain_12 = NA,
         sustain_13 = NA, 
         sustain_14 = NA,
         sustain_15 = NA,
         time_done = NA,
         time_slipping = NA,
         time_expand = NA,
         time_boundless = NA,
         money_1 = NA, 
         money_2 = NA,
         money_3 = NA,
         money_4 = NA,
         money_5 = NA,
         money_6 = NA,
         remember_1 = NA, 
         remember_2 = NA, 
         minimalism =NA, 
         exper_1 = NA,
         exper_2 = NA,
         exper_3 = NA,
         exper_4 = NA,
         exper_5 = NA,
         exper_6 = NA) %>%
   mutate(
    beautiful = case_when(
      !is.na(beautiful_response) ~ 1,
      TRUE ~ NA_integer_ 
    ),
    happy = case_when(
      !is.na(happy_response) ~ 1,
      TRUE ~ NA_integer_ 
    )
  ) %>%
  mutate(
    group = case_when(
      !is.na(beautiful) & is.na(happy) ~ "beautiful",
      !is.na(happy) & is.na(beautiful) ~ "happy",
      is.na(beautiful) & is.na(happy) ~ "control"
    )
  )
df11_clean$response <- ifelse(is.na(df11_clean$happy_response), df11_clean$beautiful_response, df11_clean$happy_response)

df11_clean <- df11_clean %>% 
  select(prolific_id, response_id, group, response, time_1, time_2, awe, weekend_1, fss_1, fss_2, fss_3, fss_4, fss_5, fss_6, fss_7, life_satisfaction_1, life_satisfaction_2, life_satisfaction_3, life_satisfaction_4, life_satisfaction_5, psych_1, psych_2, psych_3, psych_4, psych_5, psych_6, psych_7, psych_8, psych_9, psych_10, psych_11, psych_12, psych_13, psych_14, psych_15, psych_16, psych_17, psych_18, time_frozen, time_connect, time_emotional, time_immersed, time_authenticity, sustain_1, sustain_2, sustain_3, sustain_4, sustain_5, sustain_6, sustain_7, sustain_8, sustain_9, sustain_10, sustain_11, sustain_12, sustain_13, sustain_14, sustain_15, time_done, time_slipping, time_expand, time_boundless, money_1, money_2, money_3, money_4, money_5, money_6, remember_1, remember_2, minimalism, exper_1, exper_2, exper_3, exper_4, exper_5, exper_6) %>% 
  mutate(version="BeautifulMemories_Prolific_Pilot13_ITC")

Combining datasets

df_combined <- rbind(df1_clean, df2_clean, df3_clean, df4_clean, df5_clean, df6_clean, df7_clean, df8_clean, df9_clean, df10_clean, df11_clean)

write.csv(df_combined, "df_combined_wide.csv")

Generating combined dataset in long form

df_combined_long <- df_combined %>% 
  gather(variable, value, -c("response_id", group))

df_combined_long <-na.omit(df_combined_long)


write.csv(df_combined_long, "df_combined_long.csv")