Goal

The purpose of this script is to clean the raw FB Misinformation Chatfuel data, document key decisions made, and generate a clean data set for further analysis.

The key output is a wide-form dataset that is named fb_charitable_wide.csv

Summary

  • Key decisions regarding filtering and keeping the were made during cleaning include:
    1. We started off by loading the anonymized dataset which is stored in ~FB_Charitable_Giving/Data/Raw/, and we checked the uniqueness of observations by comparing the number rows and the number of unique analytic_id values. We confirmed that each observation is unique since the number of rows matches the number of unique analytic_id values.
    2. We identified participants who chose to repeat the charity matching quiz and manually recorded the Chatfuel responses for the both the first and second attempts. For analysis, we will use the responses of the first attempt.
    3. We pinpointed participants displaying atypical response behavior, such as skipping entire text blocks yet proceeding to subsequent sections (additional specifics forthcoming).
    4. We documented discrepancies between the expected and revealed charity names disclosed to participants. We noticed that cases with missing entries in the actual charity name field, but not in the expected charity name field, predominantly occur on December 28, 2023. This follows an update on December 27, 2023, to the spreadsheet with charity details, during which a new column was added without a name. Consequently, when App Engine updated its instances on December 28, 2023, it led to a disruption in data availability. This problem was identified and resolved by 10 AM on the same day (December 28). More detail on this issue can be found here.
    5. We also checked whether participants who were able to proceed to the treatment assignment phase had any missing values in the country_charity_coded, main_cause_coded, and sub_cause_coded variables. We found that some participants had missing values in these variables. We generated a series of intermediate csv files to record abnormal entries and will check these responses manually.
    6. We only keep participants who entered that chatbot when the experiment started until 12/31/2023.
    7. We also checked for the distribution of time duration of each block in the chatbot and dropped participants who had negative time duration.

Loading the dataset

  • The raw Chatfuel dataset is processed by the anonymization script and the anonymized version of the dataset is store in path ~FB_Charitable_Giving/Data/Raw/

  • The current working file path is ~FB_Charitable_Giving/Code/SurveyDataAnalysis/

data <- fread("./Data/Raw/fbcharitable_anon.csv.gz")

Functions

  • We begin by defining a few helper functions which will be used throughout the script to create tabled summaries of variables.

Most Common Table

  • This first function creates a table displaying the five most common values of a variable and includes a row for the sum of all other responses (other).
most_common_table <- function(variable, title){
    table <- table(variable, useNA = 'ifany')
    table <- sort(table, decreasing = TRUE)
    k = 5
    top_k <- head(table, 5)
    other <- sum(table[-(1:k)])
    freq_df <- data.frame(Response = names(top_k), Frequency = as.vector(top_k))
    other_df <- data.frame(Response = "Other", Frequency = other)
    result <- rbind(freq_df, other_df)
    kable(result,  caption = title, align = "c") |>
    kable_styling(bootstrap_options = c("striped", "hover", "condensed", "responsive")) 
}

Summary Table

This function creates a table displaying the frequencies of all values of a variable.

summary_table <- function(variable, title, var1, var2){
    bool_df <- as.data.frame(table(variable, useNA = 'ifany'))
    colnames(bool_df) <- c(var1, var2)
    kable(bool_df, caption = title, align = "c") |>
    kable_styling(bootstrap_options = c("striped", "hover", "condensed", "responsive")) 
}

Checking for uniqueness of observations

a= as.character(length(unique(data$`analytic_id`)))


if (nrow(data) != length(unique(data$analytic_id))) {
  stop("The number of rows does not match the number of unique analytic_id values.")
} else {
  # Continue 
  print("Unique observations check passed.")
}
## [1] "Unique observations check passed."
  • We check the uniqueness of observations by comparing the number of rows and the number of unique analytic_id, and we find that the number of rows matches the number of unique analytic_id values.

  • Currently we start off with 47680 observations for cleaning purposes

Repeater

  • In the chatbot we offer an opportunity for participants to retake the quiz if they are not happy with their final charity match. We will create a flag, repeat_quiz_coded, that is TRUE if the participants chose to redo the charity matching quiz.
data$repeat_quiz_coded <- ifelse(grepl("Sure!", data$repeat_quiz, ignore.case = TRUE), TRUE, FALSE)

summary_table(data$repeat_quiz_coded, "Summary of flag_repeat_quiz", "flag_repeat_quiz", "Frequency")
Summary of flag_repeat_quiz
flag_repeat_quiz Frequency
FALSE 47663
TRUE 17

Generating a dataset for participants who repeated the charity matching quiz

data_repeat <- data %>% filter(repeat_quiz_coded == TRUE) %>% select(analytic_id,repeat_quiz_coded)

write.csv(data_repeat, "Data/Processed/fb_charitable_repeat.csv", row.names = FALSE)
  • For people who chose to redo the charity match, in addition to record charity-specific origins, main- and sub-causes, we will record other charity intention variables manually.
  • These participants’ analytic_id are collected in the dataset fb_charitable_repeat.csv and stored at ~FB_Charitable_Giving/Data/Processed/
data <- data %>% filter(repeat_quiz_coded == FALSE)

Cleaning entrance source variables

  • The raw variable source tracks the channel in which participants entered the chatbot. There are 6 options posssible, which are direct me message, customer chat, Instagram Direct message, Instagram story mention, JSON Ad, and messenger link.

  • We will create variable source_coded to record the source of each participant. We set variable source_coded == 1 if the participants entered via JSON Ad, and 0 otherwise.

  • The table below shows the raw responses for the source variable and their count.

data %>% count(source) %>% kable("html", col.names=(c("Source", "Count"))) %>% kable_styling(bootstrap_options = c("striped", "hover"))
Source Count
213
Direct m.me + other 510
Guest Customer Chat 16
Instagram Direct 20
Instagram story mention 10
JSON Ad 46613
m.me link 281
# count of missing value in this variable 

a <- data %>% filter(source =="") %>% nrow()
  • We noticed 213 missing values in the source_coded variable. We will drop these participants from the dataset.
before_drop_source <- as.character(nrow(data))
data <- data %>% filter(source != "")
after_drop_source <- as.character(nrow(data))
  • Before dropping missing values, we have 47663 observations. After dropping missing values, we have 47450 observations.

  • This table shows the raw responses for the source variable and their count.

data %>% count(source) %>% kable("html", col.names=(c("Source", "Count"))) %>% kable_styling(bootstrap_options = c("striped", "hover"))
Source Count
Direct m.me + other 510
Guest Customer Chat 16
Instagram Direct 20
Instagram story mention 10
JSON Ad 46613
m.me link 281
  • This table shows the cleaned responses for the source variable and their count.
data$source_coded <- ifelse(data$source == "JSON Ad", 1, 0)

data %>% count(source_coded) %>% kable("html", col.names=(c("Source = JSON Ad", "Count"))) %>% kable_styling(bootstrap_options = c("striped", "hover"))
Source = JSON Ad Count
0 837
1 46613

Cleaning greeting variable

  • The top 5 most common responses for the raw greeting variable are displayed below.
most_common_table(data$greeting, "Top 5 Most Common Responses for Greeting")
Top 5 Most Common Responses for Greeting
Response Frequency
Let’s do this! 30731
Yes! 8472
4725
No 202
Stop 166
Other 3154
a1 <- data %>% count(is.na(charitable_intro_start)) %>% as.character()
  • Variable chatiatable_intro_start tracks the time participant started the chabot. There is c(FALSE, TRUE), c(38212, 9238) missing values in this variable.

  • Variable greeting_coded is the clean version of the responses to the greeting question. This is not a forced response variable. The preset answer choice is “Let’s do this!”. Participants will be able to progress to the next block of text if they’ve answered anything. However, for the greeting_coded variable we will treat responses as follows:

  • greeting_coded = “Proceeded” if the response is not missing

  • greeting_coded = “Dropped off” if the response is “missing”

data <- data %>%
  mutate(greeting_coded = case_when(
 greeting == "" ~ "Dropped off",
  TRUE ~ "Proceeded"))


data %>% count(greeting_coded) %>% kable("html", col.names=(c("Greeting", "Count"))) %>% kable_styling(bootstrap_options = c("striped", "hover"))
Greeting Count
Dropped off 4725
Proceeded 42725

Cleaning affiliation variable

  • Variable not_affil tracks to responses to the question prompt “Last thing before the quiz! You should know that this study is not affiliated with any of the charities we recommend. Recommendations, descriptions of charity work, and ratings we report are made independently.” The preset selection is “Good to know”

  • The most 5 common responses for affiliation

most_common_table(data$not_affil, "Top 5 Most Common Responses for Affiliation")
Top 5 Most Common Responses for Affiliation
Response Frequency
28660
Good to know 17942
Ok 70
ok 60
Yes 47
Other 671
  • Since we this is not a forced response variable, participants could proceed by providing any answers.

  • Variable not_affil_coded is the coded version, and we will treat responses as follows:

    • not_affil_coded = “Proceeded” if the response is not missing
    • not_affil_coded = “Dropped off” if the response is “missing”
data <- data %>%
  mutate(not_affil_coded = case_when(
 not_affil == "" ~ "Dropped off",
  TRUE ~ "Proceeded"))

Checking charity match variable

  • The raw variable US_or_Global tracks the responses to the question prompt “Would you want your impact to be focused on causes within the United States or internationally?”. Participants could only proceed if they responded 1 or 2

  • The most 5 common responses for the raw US_or_Global variable

most_common_table(data$US_or_Global, "Top 5 Most Common Responses for Pre-Consent")
Top 5 Most Common Responses for Pre-Consent
Response Frequency
29018
1 15103
2 3181
US 9
Both 6
Other 133

The preset selection is 1 for “US” or 2 for “Global”. The clean variable is named country_charity_coded. We will treat responses as follows: + country_charity_coded = US if the response is “1” + country_charity_coded = Global if the response is “2” + country_charity_coded = NA if missing or other responses

data$country_charity_coded <- data$US_or_Global

data = data %>% mutate(
  country_charity_coded = case_when(
    country_charity_coded == 1 | country_charity_coded == "#1" ~ "US",
    country_charity_coded == 2 | country_charity_coded == "#2" ~ "Global",
    TRUE ~ NA_character_
  )
)

data %>% count(country_charity_coded) %>% kable("html", col.names=(c("Country", "Count"))) %>% kable_styling(bootstrap_options = c("striped", "hover"))
Country Count
Global 3182
US 15104
NA 29164

Checking cause variable

  • The variable SuperheroUS and Global_Option track the responses for choosing the main cause of interest for the US and Global group respectively.
data %>% count(SuperheroUS) %>%
  kable("html", col.names=(c("Responses", "Count"))) %>% 
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px") 
Responses Count
32665
1 1572
1 2 3 4 5 6 1
1,2,3,4,5,6 1
2 5566
2 and 6 1
3 1676
3 5 4 2 1 1
4 1150
5 2271
6 2474
7 4
ALL 1
All 2
All of the above 2
All the above 1
Can’t work with you. 1
Delete 1
End quiz 1
Gain personal wealth and power. 1
Goodbye. 1
Ha hale no 1
I cant 1
I don’t understand English very well ok by 1
I love them all. 1
I wish to leave this study. 1
No! 1
None 2
None of the above 1
None of the above. 1
None of thease 1
Not now 1
Numbers 6 1
ONLY GOD CAN DO ALL THAT 1
Okay 1
Other 1
Protect children 1
STOP STOP STOP STOP STOP STOP 1
Stop 2
That’s it 1
To sleep with your mother board haha 1
Y 1
Yes 1
You got it 1
amen 1
do not like any of the choices! 1
eat me 1
fuck you 1
have a good day 1
have no idea what you would do 1
https://m.elaborationgroup.cn/f8d8cgZFZEVfdXlFfXpQDWULKgISam5Qe3N3KlEBKxk-FzQaSA5VAV4JIBQdAxcETDYDHw9kHBZVDkN8GxBMDXQDKmAIbiUW&p=hmtmms&_mi1704017273266 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX8lPLEX&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfALSGbgSgp41jrdRrMx_AKvJ4pkr_Kat9upINplpjt5uQ&oe=6579FA4B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX8QtgJQ&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfDAJp21zdmZ5CK00CBSra5QoPz9kGSx44JgRKBiFlk54Q&oe=6579FA4B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX_JhPSV&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfCRjKWhiYGNUEPXlsuJk11CKf8-O9V9qI-vHJD8tPqoMw&oe=6578000B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-QaqMo&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDWPitrAEAHVJtbjFt1hPcVuAEwFLy4tvgJQRAOAGiKjw&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9ZXJaR&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDKMxnvejkNl0zuQ5FlKKByj6ad6aH2mTlo70RvzeGuwQ&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX-y3lD3&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBNLEnWhdi6v76QpNqvDtzPuNfj1pjIgyI6tOUww8KH1g&oe=6585D7CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX8QdRqT&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDgmWNJtDGdj056ljfLav-BqIucXaANqHrRalSxX9grXg&oe=6589CC4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX-oDcoa&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDUpFFwkHLje0X9kd3avitC1rK_JlaYeOfbxg_-GLon3w&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX9OCkAT&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD2UC2_5Pwe1kByoCnedncZTl14nw2jkpbrANM_rl2CUg&oe=657FE90B 1
https://www.facebook.com/groups/2518763688305755/posts/2634734763375313/?comment_id=2634766763372113 1
https://www.facebook.com/groups/834453034466839/?multi_permalinks=900323724546436&ref=share 1
https://www.facebook.com/mukulsomanphotography/videos/24381894888092571/ 1
https://www.voucheronline.africa.com/walmart11.html?EQRQEms 1
i’m done 1
leave this conversation 1
lm puter priblem right now. nee 2 restart. 1
man I cant give it away, mr. president 1
nevermind this is retarded 1
none 1
not one of my choices 1
wait till 2.13 ta 2.30 wen i get home 1
wounded warriers 1
😀2 1
🛑 STOP 1
🤣 1
  • The raw SuperheroUS variable records the main US causes as follows:

    1. Transform education      
    2. Eradicate hunger and homelessness
    3. Defend the oppressed and marginalized
    4. Rescue the environment
    5. Heal the sick
    6. Protect the animals 
  • The raw Global_Option variable records the main global cuases as follows:

    1. Eradicate poverty worldwide      
    2. Defend the oppressed and marginalized
    3. Rescue the environment
    4. Heal the sick
    5. Shield the animals
  • However, the beside the preset choices, we also noticed random responses for these variables. Participants could only proceed if they select one of the preset choices.

  • We create a variable main_cause_coded to record the main cause of interest for each participants. We do so as follows:

    • main_cause_coded = transform education if country_charity_coded is US and SuperheroUS is 1
    • main_cause_coded = eradicate hunger and homelessness if country_charity_coded is US and SuperheroUS is 2
    • main_cause_coded = defend the oppressed and marginalized if country_charity_coded is US and SuperheroUS is 3 or country_charity_coded is Global and Global_Option is 2
    • main_cause_coded = rescue the environment if country_charity_coded is US and SuperheroUS is 4 or country_charity_coded is Global and Global_Option is 3
    • main_cause_coded = heal the sick if country_charity_coded is US and SuperheroUS is 5 or country_charity_coded is Global and Global_Option is 4
    • main_cause_coded = protect the animals if country_charity_coded is US and SuperheroUS is 6 or country_charity_coded is Global and Global_Option is 5
    • main_cause_coded = NA if missing or other responses
data <- data %>% 
  mutate(main_cause_coded = case_when(
    country_charity_coded == "US" & SuperheroUS == 1 ~ "Transform education",
    country_charity_coded == "US" & SuperheroUS == 2 ~ "Eradicate hunger and homelessness",
    country_charity_coded == "US" & SuperheroUS == 3 ~ "Defend the oppressed and marginalized",
    country_charity_coded == "US" & SuperheroUS == 4 ~ "Rescue the environment",
    country_charity_coded == "US" & SuperheroUS == 5 ~ "Heal the sick",
    country_charity_coded == "US" & SuperheroUS == 6 ~ "Protect the animals",
    country_charity_coded == "Global" & Global_Option == 1 ~ "Eradicate poverty worldwide",
    country_charity_coded == "Global" & Global_Option == 2 ~ "Defend the oppressed and marginalized",
    country_charity_coded == "Global" & Global_Option == 3 ~ "Rescue the environment",
    country_charity_coded == "Global" & Global_Option == 4 ~ "Heal the sick",
    country_charity_coded == "Global" & Global_Option == 5 ~ "Protect the animals",
    TRUE ~ NA_character_
  ))
data %>% 
  group_by(country_charity_coded) %>% 
  count(main_cause_coded) %>%
  kable("html", col.names=(c("Country", "Main Cause", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Country Main Cause Count
Global Defend the oppressed and marginalized 771
Global Eradicate poverty worldwide 1038
Global Heal the sick 378
Global Protect the animals 355
Global Rescue the environment 541
Global NA 99
US Defend the oppressed and marginalized 1663
US Eradicate hunger and homelessness 5531
US Heal the sick 2260
US Protect the animals 2466
US Rescue the environment 1144
US Transform education 1562
US NA 478
NA NA 29164

Checking charity sub-causes variables

  • For each main cause, there are sub causes participants were asked to select, which are described as follows:

  • If country_choice_coded is US:

    • The sub-causes for Transform education are:
      1. help all children learn to read
      2. send a low income student to college
      3. support girls in STEM
      4. help teachers fund classroom projects
      5. provide tutoring and support to underserved children
    • The sub-causes for Eradicate hunger and homelessness are:
      1. a roof over their head
      2. hot food in their belly
      3. employment training and opportunities
    • The sub-causes for Defend the oppressed and marginalized are:
      1. immigrants and refugees fleeing violence
      2. LGBTQ+ communities
      3. racial or ethnic minorities
      4. women
      5. people with disabilities
    • The sub-causes for Rescue the environment are:
      1. innovations that further clean energy technology
      2. massive ocean clean up
      3. conserving natural spaces and habitats like old rainforests and national parks
      4. new policies to regulate carbon emissions
    • The sub-causes for Heal the sick are:
      1. people suffering from preventable diseases because of inadequate healthcare
      2. rare diseases that need more research
      3. cancer: The Big C
      4. people with heart disease
    • The sub-causes for Protect the animals are:
      1. dogs & cats humans’ best friends
      2. all the WILD furry animals like lions, tigers and bears (oh and koalas)
      3. any species on the brink of extinction
      4. animals in factory farms
      5. whales and ocean animals (Baby Beluga! Nemo!!)
  • If country_choice_coded is Global:

    • The sub-causes for Eradicate poverty worldwide are:
      1. the opportunity to go to school
      2. food in their belly
      3. the skills to grow food sustainably
      4. access to clean water
    • The sub-causes for Defend the oppressed and marginalized are:
      1. refugees fleeing violence or other disasters
      2. people that are victims of human trafficking
      3. women
      4. groups targeted by their government
    • The sub-causes for Rescue the environment are:
      1. innovations that further clean energy technology
      2. massive ocean clean up
      3. conserving natural spaces and habitats like old rainforests and national parks
      4. new policies to regulate carbon emissions
    • The sub-causes for Heal the sick are:
      1. protecting against preventable childhood diseases
      2. treating the big three: HIV, AIDS, Tuburculosis and Malaria
      3. eradicating polio
      4. preventing and curing blindness
    • The sub-causes for Protect the animals are:
      1. all the WILD furry animals like lions, tigers and bears (oh and koalas)
      2. any species on the brink of extinction
      3. whales and ocean animals (Baby Beluga! Nemo!!)
  • We create variable sub_cause_coded to record the sub-cause of each charity

data <- data %>% 
  mutate(sub_cause_coded = case_when(
   country_charity_coded == "US" & SuperheroUS == 1 & US_Help_eduction == 1  ~ "help all children learn to read",
   country_charity_coded == "US" & SuperheroUS == 1 & US_Help_eduction == 2  ~ "send a low income student to college",
   country_charity_coded == "US" & SuperheroUS == 1 & US_Help_eduction == 3  ~ "support girls in STEM",
   country_charity_coded == "US" & SuperheroUS == 1 & US_Help_eduction == 4  ~ "help teachers fund classroom projects",
   country_charity_coded == "US" & SuperheroUS == 1 & US_Help_eduction == 5  ~ "provide tutoring and support to underserved children",
   country_charity_coded == "US" & SuperheroUS == 2 & US_Help_HungerHomeless == 1  ~ "a roof over their head",
   country_charity_coded == "US" & SuperheroUS == 2 & US_Help_HungerHomeless == 2  ~ "hot food in their belly",
   country_charity_coded == "US" & SuperheroUS == 2 & US_Help_HungerHomeless == 3  ~ "employment training and opportunities",
   country_charity_coded == "US" & SuperheroUS == 3 & US_Help_oppressed == 1  ~ "immigrants and refugees fleeing violence",
   country_charity_coded == "US" & SuperheroUS == 3 & US_Help_oppressed == 2  ~ "LGBTQ+ communities",
   country_charity_coded == "US" & SuperheroUS == 3 & US_Help_oppressed == 3  ~ "racial or ethnic minorities",
   country_charity_coded == "US" & SuperheroUS == 3 & US_Help_oppressed == 4  ~ "women",
   country_charity_coded == "US" & SuperheroUS == 3 & US_Help_oppressed == 5  ~ "people with disabilities",
   country_charity_coded == "US" & SuperheroUS == 4 & US_Help_environment == 1  ~ "innovations that further clean energy technology",
   country_charity_coded == "US" & SuperheroUS == 4 & US_Help_environment == 2  ~ "massive ocean clean up",
   country_charity_coded == "US" & SuperheroUS == 4 & US_Help_environment == 3  ~ "conserving natural spaces and habitats like old rainforests and national parks",
   country_charity_coded == "US" & SuperheroUS == 4 & US_Help_environment == 4  ~ "new policies to regulate carbon emissions",
   country_charity_coded == "US" & SuperheroUS == 5 & US_help_sick == 1  ~ "people suffering from preventable diseases because of inadequate healthcare",
   country_charity_coded == "US" & SuperheroUS == 5 & US_help_sick == 2  ~ "rare diseases that need more research",
   country_charity_coded == "US" & SuperheroUS == 5 & US_help_sick == 3  ~ "cancer: The Big C",
   country_charity_coded == "US" & SuperheroUS == 5 & US_help_sick == 4  ~ "people with heart disease",
   country_charity_coded == "US" & SuperheroUS == 6 & US_Help_animals == 1  ~ "dogs & cats humans' best friends",
   country_charity_coded == "US" & SuperheroUS == 6 & US_Help_animals == 2  ~ "all the WILD furry animals like lions, tigers and bears (oh and koalas)",
   country_charity_coded == "US" & SuperheroUS == 6 & US_Help_animals == 3  ~ "any species on the brink of extinction",
   country_charity_coded == "US" & SuperheroUS == 6 & US_Help_animals == 4  ~ "animals in factory farms",
   country_charity_coded == "US" & SuperheroUS == 6 & US_Help_animals == 5  ~ "whales and ocean animals (Baby Beluga! Nemo!!)",
   country_charity_coded == "Global" & Global_Option == 1 & Global_help_poverty == 1  ~ "the opportunity to go to school",
   country_charity_coded == "Global" & Global_Option == 1 & Global_help_poverty == 2  ~ "food in their belly",
   country_charity_coded == "Global" & Global_Option == 1 & Global_help_poverty == 3  ~ "the skills to grow food sustainably",
   country_charity_coded == "Global" & Global_Option == 1 & Global_help_poverty == 4  ~ "access to clean water",
   country_charity_coded == "Global" & Global_Option == 2 & Global_help_oppressed == 1  ~ "refugees fleeing violence or other disasters",
   country_charity_coded == "Global" & Global_Option == 2 & Global_help_oppressed == 2  ~ "people that are victims of human trafficking",
   country_charity_coded == "Global" & Global_Option == 2 & Global_help_oppressed == 3  ~ "women", 
   country_charity_coded == "Global" & Global_Option == 2 & Global_help_oppressed == 4  ~ "groups targeted by their government",
   country_charity_coded == "Global" & Global_Option == 3 & Global_help_enivronment == 1  ~ "innovations that further clean energy technology",
   country_charity_coded == "Global" & Global_Option == 3 & Global_help_enivronment == 2  ~ "massive ocean clean up",
   country_charity_coded == "Global" & Global_Option == 3 & Global_help_enivronment == 3  ~ "conserving natural spaces and habitats like old rainforests and national parks",
   country_charity_coded == "Global" & Global_Option == 3 & Global_help_enivronment == 4  ~ "new policies to regulate carbon emissions",
   country_charity_coded == "Global" & Global_Option == 4 & Global_help_sick == 1  ~ "protecting against preventable childhood diseases",
   country_charity_coded == "Global" & Global_Option == 4 & Global_help_sick == 2  ~ "treating the big three: HIV, AIDS, Tuburculosis and Malaria",
   country_charity_coded == "Global" & Global_Option == 4 & Global_help_sick == 3  ~ "eradicating polio",
   country_charity_coded == "Global" & Global_Option == 4 & Global_help_sick == 4  ~ "preventing and curing blindness",
   country_charity_coded == "Global" & Global_Option == 5 & Global_help_animals == 1  ~ "all the WILD furry animals like lions, tigers and bears (oh and koalas)",
   country_charity_coded == "Global" & Global_Option == 5 & Global_help_animals == 2  ~ "any species on the brink of extinction",
   country_charity_coded == "Global" & Global_Option == 5 & Global_help_animals == 3  ~ "whales and ocean animals (Baby Beluga! Nemo!!)",
   TRUE ~ NA_character_
  ))
data %>% group_by(country_charity_coded, main_cause_coded) %>% count(sub_cause_coded) %>%
  kable("html", col.names=(c("Country" , "Main Cause", "Sub Cause", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Country Main Cause Sub Cause Count
Global Defend the oppressed and marginalized groups targeted by their government 156
Global Defend the oppressed and marginalized people that are victims of human trafficking 111
Global Defend the oppressed and marginalized refugees fleeing violence or other disasters 375
Global Defend the oppressed and marginalized women 99
Global Defend the oppressed and marginalized NA 30
Global Eradicate poverty worldwide access to clean water 227
Global Eradicate poverty worldwide food in their belly 249
Global Eradicate poverty worldwide the opportunity to go to school 248
Global Eradicate poverty worldwide the skills to grow food sustainably 299
Global Eradicate poverty worldwide NA 15
Global Heal the sick eradicating polio 12
Global Heal the sick preventing and curing blindness 52
Global Heal the sick protecting against preventable childhood diseases 195
Global Heal the sick treating the big three: HIV, AIDS, Tuburculosis and Malaria 96
Global Heal the sick NA 23
Global Protect the animals all the WILD furry animals like lions, tigers and bears (oh and koalas) 143
Global Protect the animals any species on the brink of extinction 178
Global Protect the animals whales and ocean animals (Baby Beluga! Nemo!!) 22
Global Protect the animals NA 12
Global Rescue the environment conserving natural spaces and habitats like old rainforests and national parks 193
Global Rescue the environment innovations that further clean energy technology 122
Global Rescue the environment massive ocean clean up 106
Global Rescue the environment new policies to regulate carbon emissions 109
Global Rescue the environment NA 11
Global NA NA 99
US Defend the oppressed and marginalized LGBTQ+ communities 295
US Defend the oppressed and marginalized immigrants and refugees fleeing violence 339
US Defend the oppressed and marginalized people with disabilities 356
US Defend the oppressed and marginalized racial or ethnic minorities 328
US Defend the oppressed and marginalized women 269
US Defend the oppressed and marginalized NA 76
US Eradicate hunger and homelessness a roof over their head 1904
US Eradicate hunger and homelessness employment training and opportunities 1729
US Eradicate hunger and homelessness hot food in their belly 1819
US Eradicate hunger and homelessness NA 79
US Heal the sick cancer: The Big C 1025
US Heal the sick people suffering from preventable diseases because of inadequate healthcare 593
US Heal the sick people with heart disease 238
US Heal the sick rare diseases that need more research 340
US Heal the sick NA 64
US Protect the animals all the WILD furry animals like lions, tigers and bears (oh and koalas) 204
US Protect the animals animals in factory farms 222
US Protect the animals any species on the brink of extinction 201
US Protect the animals dogs & cats humans’ best friends 1704
US Protect the animals whales and ocean animals (Baby Beluga! Nemo!!) 68
US Protect the animals NA 67
US Rescue the environment conserving natural spaces and habitats like old rainforests and national parks 437
US Rescue the environment innovations that further clean energy technology 251
US Rescue the environment massive ocean clean up 190
US Rescue the environment new policies to regulate carbon emissions 219
US Rescue the environment NA 47
US Transform education help all children learn to read 635
US Transform education help teachers fund classroom projects 154
US Transform education provide tutoring and support to underserved children 404
US Transform education send a low income student to college 137
US Transform education support girls in STEM 139
US Transform education NA 93
US NA NA 478
NA NA NA 29164

Sanity check

  • We will check if participants who responded to the main cause have missing values for country_charity_coded
abnormal_main_cause <- data %>% filter(!is.na(main_cause_coded)) %>% 
        select(analytic_id, country_charity_coded, main_cause_coded) %>% 
        filter(is.na(country_charity_coded))
  • We did not notice anything abnormal in the responses for the main cause

Checking charity match

  • The raw variable charity_name records the actual charity name that was revealed to the participants after the charity matching quiz. In the chatbot, we initially programmed the charity names to be revealed based on the country origin, main cause and sub-cause selected by the participants. However, we noticed multiple instances where actual charity names did not match the country orgin, main cause and sub-cause selected by the participants.

-The table below checks to see if the revealed charity names match the country origin of the charity.

data %>% group_by(country_charity_coded) %>% count(charity_name) %>% kable("html", col.names=(c("Country", "Revealed Charity Name", "Count")))%>% kable_styling(bootstrap_options = c("striped", "hover"))
Country Revealed Charity Name Count
Global 192
Global Amnesty International 155
Global BRAC 296
Global Clean Air Task Force 109
Global Concern Worldwide 96
Global Evidence Action Inc.  193
Global Feeding America 3
Global Freedom Network 111
Global Global Fund for Women 98
Global HIAS 375
Global HealthWell Foundation 1
Global Housing Matters 2
Global Natural Resources Defense Council 122
Global Rainforest Trust 194
Global Reading is Fundamental 1
Global Room to Read 247
Global Sightsavers Inc.  53
Global Surfrider Foundation 106
Global The Ocean Foundation 22
Global The Rotary Foundation 12
Global WaterAid 226
Global Wild Earth Allies 143
Global Wildlife SOS 178
Global World Food Program 246
Global Year Up 1
US 938
US American Heart Association 237
US American Society for the Prevention of Cruelty to Animals 1697
US Clean Air Task Force 217
US Concern Worldwide 1
US Dana-Farber Cancer Institute 1029
US DonorsChoose 154
US Feeding America 1814
US Girls Inc.  139
US HIAS 338
US HealthWell Foundation 592
US Housing Matters 1899
US Mercy For Animals 222
US National Women’s Law Center 267
US Natural Resources Defense Council 251
US Rainforest Trust 438
US Reading is Fundamental 632
US Rocketship Education 401
US Sightsavers Inc.  1
US Southern Poverty Law Center 326
US Special Olympics 354
US Surfrider Foundation 188
US The Leukemia & Lymphoma Society 339
US The Ocean Foundation 68
US The Trevor Project 294
US Thurgood Marshall College Fund 138
US Wild Earth Allies 205
US Wildlife SOS 201
US Year Up 1724
NA 29149
NA American Society for the Prevention of Cruelty to Animals 1
NA Clean Air Task Force 1
NA DonorsChoose 1
NA Feeding America 3
NA HIAS 2
NA HealthWell Foundation 1
NA Housing Matters 1
NA Mercy For Animals 1
NA Rainforest Trust 1
NA Reading is Fundamental 1
NA Year Up 2
  • We noticed a number of instances where the revealed charity names did not match the country origin of the charity. For example, Feeding America was revealed for choosing Global as the country origin.

  • We also noticed instances where country_charity_coded is missing but the charity name is revealed.

data <- data %>% 
  mutate(charity_name_coded = case_when(
   country_charity_coded == "US" & SuperheroUS == 1 & US_Help_eduction == 1  ~ "Reading is Fundamental",
   country_charity_coded == "US" & SuperheroUS == 1 & US_Help_eduction == 2  ~ "Thurgood Marshall College Fund",
   country_charity_coded == "US" & SuperheroUS == 1 & US_Help_eduction == 3  ~ "Girls Inc.",
   country_charity_coded == "US" & SuperheroUS == 1 & US_Help_eduction == 4  ~ "DonorsChoose",
   country_charity_coded == "US" & SuperheroUS == 1 & US_Help_eduction == 5  ~ "Rocketship Education",
   country_charity_coded == "US" & SuperheroUS == 2 & US_Help_HungerHomeless == 1  ~ "Housing Matters",
   country_charity_coded == "US" & SuperheroUS == 2 & US_Help_HungerHomeless == 2  ~ "Feeding America",
   country_charity_coded == "US" & SuperheroUS == 2 & US_Help_HungerHomeless == 3  ~ "Year Up",
   country_charity_coded == "US" & SuperheroUS == 3 & US_Help_oppressed == 1  ~ "HIAS",
   country_charity_coded == "US" & SuperheroUS == 3 & US_Help_oppressed == 2  ~ "The Trevor Project",
   country_charity_coded == "US" & SuperheroUS == 3 & US_Help_oppressed == 3  ~ "Southern Poverty Law Center",
   country_charity_coded == "US" & SuperheroUS == 3 & US_Help_oppressed == 4  ~ "National Women's Law Center",
   country_charity_coded == "US" & SuperheroUS == 3 & US_Help_oppressed == 5  ~ "Special Olympics",
   country_charity_coded == "US" & SuperheroUS == 4 & US_Help_environment == 1  ~ "Natural Resources Defense Council",
   country_charity_coded == "US" & SuperheroUS == 4 & US_Help_environment == 2  ~ "Surfrider Foundation",
   country_charity_coded == "US" & SuperheroUS == 4 & US_Help_environment == 3  ~ "Rainforest Trust",
   country_charity_coded == "US" & SuperheroUS == 4 & US_Help_environment == 4  ~ "Clean Air Task Force",
   country_charity_coded == "US" & SuperheroUS == 5 & US_help_sick == 1  ~ "HealthWell Foundation",
   country_charity_coded == "US" & SuperheroUS == 5 & US_help_sick == 2  ~ "The Leukemia & Lymphoma Society",
   country_charity_coded == "US" & SuperheroUS == 5 & US_help_sick == 3  ~ "Dana-Farber Cancer Institute",
   country_charity_coded == "US" & SuperheroUS == 5 & US_help_sick == 4  ~ "American Heart Association",
   country_charity_coded == "US" & SuperheroUS == 6 & US_Help_animals == 1  ~ "American Society for the Prevention of Cruelty to Animals",
   country_charity_coded == "US" & SuperheroUS == 6 & US_Help_animals == 2  ~ "Wild Earth Allies",
   country_charity_coded == "US" & SuperheroUS == 6 & US_Help_animals == 3  ~ "Wildlife SOS",
   country_charity_coded == "US" & SuperheroUS == 6 & US_Help_animals == 4  ~ "Mercy For Animals",
   country_charity_coded == "US" & SuperheroUS == 6 & US_Help_animals == 5  ~ "The Ocean Foundation",
   country_charity_coded == "Global" & Global_Option == 1 & Global_help_poverty == 1  ~ "Room to Read",
   country_charity_coded == "Global" & Global_Option == 1 & Global_help_poverty == 2  ~ "World Food Program",
   country_charity_coded == "Global" & Global_Option == 1 & Global_help_poverty == 3  ~ "BRAC",
   country_charity_coded == "Global" & Global_Option == 1 & Global_help_poverty == 4  ~ "WaterAid",
   country_charity_coded == "Global" & Global_Option == 2 & Global_help_oppressed == 1  ~ "HIAS",
   country_charity_coded == "Global" & Global_Option == 2 & Global_help_oppressed == 2  ~ "Freedom Network",
   country_charity_coded == "Global" & Global_Option == 2 & Global_help_oppressed == 3  ~ "Global Fund for Women", 
   country_charity_coded == "Global" & Global_Option == 2 & Global_help_oppressed == 4  ~ "Amnesty International",
   country_charity_coded == "Global" & Global_Option == 3 & Global_help_enivronment == 1  ~ "Natural Resources Defense Council",
   country_charity_coded == "Global" & Global_Option == 3 & Global_help_enivronment == 2  ~ "Surfrider Foundation",
   country_charity_coded == "Global" & Global_Option == 3 & Global_help_enivronment == 3  ~ "Rainforest Trust",
   country_charity_coded == "Global" & Global_Option == 3 & Global_help_enivronment == 4  ~ "Clean Air Task Force",
   country_charity_coded == "Global" & Global_Option == 4 & Global_help_sick == 1  ~ "Evidence Action Inc.",
   country_charity_coded == "Global" & Global_Option == 4 & Global_help_sick == 2  ~ "Concern Worldwide",
   country_charity_coded == "Global" & Global_Option == 4 & Global_help_sick == 3  ~ "The Rotary Foundation",
   country_charity_coded == "Global" & Global_Option == 4 & Global_help_sick == 4  ~ "Sightsavers Inc.",
   country_charity_coded == "Global" & Global_Option == 5 & Global_help_animals == 1  ~ "Wild Earth Allies",
   country_charity_coded == "Global" & Global_Option == 5 & Global_help_animals == 2  ~ "Wildlife SOS",
   country_charity_coded == "Global" & Global_Option == 5 & Global_help_animals == 3  ~ "The Ocean Foundation",
   TRUE ~ NA_character_
  ))
  • In the table below, we check if the revealed charity names match all of the country origin, the main cause, and sub-cause selected by the participants. Column expected_charity_name is the charity name that should be revealed based on the country origin, main cause, and sub-cause selected by the participants. Column revealed_charity_name is the charity name that was actually revealed to the participants.
data %>% group_by(charity_name_coded) %>% count(charity_name) %>% kable("html", col.names=(c("Expected Charity Name", "Revealed Charity Name", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Expected Charity Name Revealed Charity Name Count
American Heart Association 1
American Heart Association American Heart Association 237
American Society for the Prevention of Cruelty to Animals 7
American Society for the Prevention of Cruelty to Animals American Society for the Prevention of Cruelty to Animals 1697
Amnesty International 1
Amnesty International Amnesty International 155
BRAC 1
BRAC BRAC 296
BRAC Feeding America 1
BRAC HIAS 1
Clean Air Task Force 3
Clean Air Task Force Clean Air Task Force 325
Concern Worldwide Concern Worldwide 96
Dana-Farber Cancer Institute 1
Dana-Farber Cancer Institute Dana-Farber Cancer Institute 1023
Dana-Farber Cancer Institute Housing Matters 1
DonorsChoose DonorsChoose 154
Evidence Action Inc.  2
Evidence Action Inc.  Evidence Action Inc.  193
Feeding America 8
Feeding America Dana-Farber Cancer Institute 1
Feeding America Feeding America 1810
Freedom Network Freedom Network 111
Girls Inc.  Girls Inc.  139
Global Fund for Women 1
Global Fund for Women Global Fund for Women 98
HIAS 3
HIAS HIAS 711
HealthWell Foundation 3
HealthWell Foundation HealthWell Foundation 590
Housing Matters 7
Housing Matters Housing Matters 1897
Mercy For Animals Mercy For Animals 222
National Women’s Law Center 3
National Women’s Law Center National Women’s Law Center 266
Natural Resources Defense Council 2
Natural Resources Defense Council Natural Resources Defense Council 371
Rainforest Trust 2
Rainforest Trust Rainforest Trust 628
Reading is Fundamental 3
Reading is Fundamental Reading is Fundamental 632
Rocketship Education 3
Rocketship Education Rocketship Education 401
Room to Read 3
Room to Read Room to Read 245
Sightsavers Inc.  Sightsavers Inc.  52
Southern Poverty Law Center 1
Southern Poverty Law Center Southern Poverty Law Center 326
Southern Poverty Law Center The Trevor Project 1
Special Olympics 3
Special Olympics Special Olympics 353
Surfrider Foundation 3
Surfrider Foundation Surfrider Foundation 293
The Leukemia & Lymphoma Society 1
The Leukemia & Lymphoma Society The Leukemia & Lymphoma Society 339
The Ocean Foundation The Ocean Foundation 90
The Rotary Foundation The Rotary Foundation 12
The Trevor Project 2
The Trevor Project The Trevor Project 293
Thurgood Marshall College Fund Thurgood Marshall College Fund 137
WaterAid 1
WaterAid WaterAid 226
Wild Earth Allies Wild Earth Allies 347
Wildlife SOS 1
Wildlife SOS Wildlife SOS 378
World Food Program 3
World Food Program World Food Program 246
Year Up 6
Year Up Year Up 1723
NA 30204
NA American Society for the Prevention of Cruelty to Animals 1
NA Clean Air Task Force 2
NA Concern Worldwide 1
NA Dana-Farber Cancer Institute 5
NA DonorsChoose 1
NA Feeding America 9
NA HIAS 3
NA HealthWell Foundation 4
NA Housing Matters 4
NA Mercy For Animals 1
NA National Women’s Law Center 1
NA Natural Resources Defense Council 2
NA Rainforest Trust 5
NA Reading is Fundamental 2
NA Room to Read 2
NA Sightsavers Inc.  2
NA Special Olympics 1
NA Surfrider Foundation 1
NA Thurgood Marshall College Fund 1
NA Wild Earth Allies 1
NA Wildlife SOS 1
NA Year Up 4
data$abnormal_charity_match <- ifelse(data$charity_name == data$charity_name_coded, FALSE, TRUE)

abnormal_charity <- data %>% select(analytic_id, charity_name, charity_name_coded, abnormal_charity_match, charitable_intro_start) %>% filter(abnormal_charity_match == TRUE)

n_abnormal <- as.character(nrow(abnormal_charity))

# write csv 
write.csv(abnormal_charity, "./Data/Processed/abnormal_charity_match.csv", row.names = FALSE)
  • Checking mismatch and creating a flag abnormal_charity_match where TRUE indicates a mismatch between the charity name and the main cause and sub-cause selected by the participant. We stored these participants in abnormal_charity_match.csv for further review. We are currently having 80 participants who have mismatched charity names.

  • For charity mismatches where the expected charity names did not match the revealed charity names (especially for cases where the expected charity name is not empty but the revealed charity name is empty), we will look at the distribution of time entered the chatbot of these participants.

  • The table below shows the distribution of the time entered the chatbot for participants with missing values for the revealed charity name but not for the expected charity name.

abnormal_charity$charitable_intro_start_1 <- as.POSIXct(abnormal_charity$"charitable_intro_start", format="%Y-%m-%dT%H:%M:%SZ", tz="UTC")

abnormal_charity$charitable_intro_start_time <- format(abnormal_charity$charitable_intro_start_1, "%Y-%m-%d %H:%M:%S")

# dropping instances where expected charity is not missing but revealed charity is missing

abnormal_charity_1 <- abnormal_charity %>% filter(charity_name=="" & !is.na(charity_name_coded))

abnormal_charity_date <- abnormal_charity_1 %>% select(analytic_id, charitable_intro_start_time) %>% mutate(day=as.Date(charitable_intro_start_time)) %>% group_by(day) %>% summarise(n=n())%>%
  mutate(pct = n/sum(n))

abnormal_charity_date %>% kable("html", col.names=(c("Day of Starting the Chatbot", "Count", "% of abnormal participants starting the Chatbot"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Day of Starting the Chatbot Count % of abnormal participants starting the Chatbot
2023-12-28 65 0.8666667
NA 10 0.1333333
ggplot(abnormal_charity_date,
       aes(x = day, y = pct)) +
  geom_bar(position = "identity", stat = "identity") +
  scale_y_continuous(limits = c(0, 1), labels = scales::percent, expand = c(0, 0, 0, 0)) +
  scale_x_date(breaks = "day") +
  labs(x = "Day of Starting the Chatbot",
       y = "% of abnormal participants starting the Chatbot") +
  theme(legend.position = "none",
        axis.text.x = element_text(angle = 90))

  • The graph indicates that cases with missing entries in the actual charity name field, but not in the expected charity name field, predominantly occur on December 28, 2023. This follows an update on December 27, 2023, to the spreadsheet with charity details, during which a new column was added without a name. Consequently, when App Engine updated its instances on December 28, 2023, it led to a disruption in data availability. This problem was identified and resolved by 10 AM on the same day (December 28). More detail on this issue can be found here.

  • We will not drop these participants, but instead will create two separate flags for these participants:

    1. charity_mismatch_type_1 = 1 if the expected charity name is not missing but the revealed charity name is missing
    2. charity_mismatch_type_2 = 1 if the expected charity name does not match the revealed charity name
abnormal_charity <- abnormal_charity %>% 
  mutate(charity_mismatch_type_1 = ifelse(charity_name != "" & !is.na(charity_name_coded), NA, 1),
         charity_mismatch_type_2 = case_when(is.na(charity_mismatch_type_1) ~ 1,
                                             TRUE ~ NA
                                             ))

# left join the main data frame 
data <- data %>% left_join(abnormal_charity %>% select(analytic_id, charity_mismatch_type_1, charity_mismatch_type_2), by = "analytic_id")
  • The table below shows the number of participants who have charity_mismatch_type_1 and charity_mismatch_type_2
data %>% select(charity_mismatch_type_1, charity_mismatch_type_2) %>% 
  dplyr::summarize(charity_mismatch_type_1 = sum(!is.na(charity_mismatch_type_1)),
            charity_mismatch_type_2 = sum(!is.na(charity_mismatch_type_2))) %>%
  kable("html", col.names=(c("Charity Mismatch Type 1", "Charity Mismatch Type 2"))) %>% 
  kable_styling(bootstrap_options = c("striped", "hover"))
Charity Mismatch Type 1 Charity Mismatch Type 2
75 5

Checking “Is it for me?” variable

  • After revealing a charity and telling the participants that the charity is being rated 4/4 stars by Charity Navigator, we asked the participants “But is it for me?”. We did not implement forced repsonse for this question so participants could proceed by entering anything.

  • If a participant answered, we will consider it as “Proceeded” and if a participant did not respond to this question, we will consider it as “Dropped Off”

data <- data %>%
  mutate(for_me_coded = case_when(
 is_it_for_me == "" ~ "Dropped off",
  TRUE ~ "Proceeded"))

data %>% count(for_me_coded) %>% kable("html", col.names=(c("Is it for Me?", "Count"))) %>% kable_styling(bootstrap_options = c("striped", "hover"))
Is it for Me? Count
Dropped off 34466
Proceeded 12984

Checking donor type

  • In the chatbot, there are four donor_type which are smart, responsive, forward_looking, and unsure which are determined by having the participants to answer three questions: When you think about your ideal charity, how important is it to you that they…

    1. “… have transparency and accountability in their finances and administration?”
    2. “… are meeting immediate, urgent needs?”
    3. “… are focused on the big picture and longterm solutions?”
  • Partipants answered these questions on a likert scale from “Not at all” (1) to “Somewhat” to “Very” (3)

  • Variable important_smart records the response to the first question, important_responsive records the response to the second question, and important_forward_looking records the response to the third question.

  • This table shows the raw responses for the important_smart variable

data %>% count(important_smart) %>% kable("html", col.names=(c("Importance of Transparency and Accountability", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Importance of Transparency and Accountability Count
1 907
2 2432
3 13631
NA 30480
  • We will create a new variable important_smart_coded where important_smart_coded==1if important_smart == 1, important_smart_coded==2if important_smart == 2, and important_smart_coded==3if important_smart == 3
data <- data %>% 
  mutate(important_smart_coded = case_when(
    important_smart == 1 ~ 1,
    important_smart == 2 ~ 2,
    important_smart == 3 ~ 3
  ))

data %>% count(important_smart_coded) %>% kable("html", col.names=(c("Importance of Transparency and Accountability", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Importance of Transparency and Accountability Count
1 907
2 2432
3 13631
NA 30480
  • This table shows the raw responses for the important_responsive variable
data %>% count(important_responsive) %>% kable("html", col.names=(c("Importance of Meeting Immediate, Urgent Needs", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Importance of Meeting Immediate, Urgent Needs Count
30650
1 979
2 4666
3 11139
Bye 1
I am VERY CONFUSED about a pop-up message that said this chat and survey are not legit. 1
I’m done 2
Interested! 1
Not at all 1
Quit 1
Someone who can talk to me about the daily topic 1
Start over 1
Stop 1
cancel 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=uErTguOXKsgAX_9FVis&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfCDXCwNRUoCXpqpA6agbHIppG3pnqw8W2la2vWkSikSDA&oe=657B4AC6 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX97ziUN&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBR35TkjPUX1Slle8MUgbkYWxIT5tLZWYTTkRBYYgFeDw&oe=6572114B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-EKfPj&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD-IK-f-HubVCCykZJ5VL8X7J8-XI5P0hjI6RN0crmbTA&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX_sMArl&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBu1ua7fnL_zP3-957_ejDe3QTjPVf5dk2ButtSzKkCag&oe=65740B8B 1
😎🤓1 1
  • We will create a new variable important_responsive_coded where important_responsive_coded==1if important_responsive == 1, important_responsive_coded==2if important_responsive == 2, and important_responsive_coded==3if important_responsive == 3
data <- data %>% 
  mutate(important_responsive_coded = case_when(
    important_responsive == 1 ~ 1,
    important_responsive == 2 ~ 2,
    important_responsive == 3 ~ 3
  ))

data %>% count(important_responsive_coded) %>% kable("html", col.names=(c("Importance of Meeting Immediate, Urgent Needs", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Importance of Meeting Immediate, Urgent Needs Count
1 979
2 4666
3 11139
NA 30666
  • This table shows the raw responses for the important_forward_looking variable
data %>% count(important_forwardlooking) %>% kable("html", col.names=(c("Importance of Focusing on the Big Picture and Longterm Solutions", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Importance of Focusing on the Big Picture and Longterm Solutions Count
30845
1 545
2 4249
3 11811
  • We will create a new variable important_forward_looking_coded where important_forward_looking_coded==1if important_forward_looking == 1, important_forward_looking_coded==2if important_forward_looking == 2, and important_forward_looking_coded==3if important_forward_looking == 3
data <- data %>% 
  mutate(important_forward_looking_coded = case_when(
    important_forwardlooking == 1 ~ 1,
    important_forwardlooking == 2 ~ 2,
    important_forwardlooking == 3 ~ 3
  ))

data %>% count(important_forward_looking_coded) %>% kable("html", col.names=(c("Importance of Focusing on the Big Picture and Longterm Solutions", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Importance of Focusing on the Big Picture and Longterm Solutions Count
1 545
2 4249
3 11811
NA 30845
  • If the donor_type is smart, then the partipant will be shown the smart_text customized based on the revealing charity

  • If the donor_type is responsive, then the partipant will be shown the responsive_text customized based on the revealing charity

  • If the donor_type is forward_looking, then the partipant will be shown the forward_text customized based on the revealing charity

  • If the donor_type is unsure, then the partipant will be randomly (50-50) shown the responsive_text or the forward_text customized based on the revealing charity

  • We will create a variable donor_type_coded to record the assigned donor_type.

data$donor_type_coded <- data$donor_type

data %>% count(donor_type_coded) %>% kable("html", col.names=(c("Donor Type", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Donor Type Count
30849
forward_looking 5339
responsive 4784
smart 6379
unsure 99

Checking treatment assignment

  • The raw variable treatment_group records the three groups participants were assigned to. When programming the chatbot, we set treatment assignment to be 20% for the control group, 40% for the opportunity group, and 40% for the obligation group. We will inspect and rename this variable as arm_coded

  • Checking raw responses, missing values indicate participants who did not get a treatment assignment.

data %>% count(treatment_group) %>% kable("html", col.names=(c("Treatment Group", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Treatment Group Count
36252
control 2253
obligation 4533
opportunity 4412
data$arm_coded <- data$treatment_group

Sanity check

  • In this section, we checked for a series of abnormal responses conditioned on participants who received a treatment assignment. Participants who were assigned to either the control, opportunity, or obligation must have recorded entries for the variables country_charity_coded, main_cause_coded, sub_cause_coded, and charity_name_coded.
data %>% group_by(arm_coded) %>% count(country_charity_coded) %>% kable("html", col.names=(c("Treatment Group", "Country", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Treatment Group Country Count
Global 1120
US 5979
NA 29153
control Global 414
control US 1836
control NA 3
obligation Global 841
obligation US 3687
obligation NA 5
opportunity Global 807
opportunity US 3602
opportunity NA 3
abnormal_treatment<- data %>% filter(arm_coded != "") %>% select(analytic_id, country_charity_coded, arm_coded) %>% filter(is.na(country_charity_coded)) 

# store as csv for investigation 
write.csv(abnormal_treatment, "./Data/Processed/abnormal_treatment.csv", row.names = FALSE)

n_abnormal_treatment <- as.character(nrow(abnormal_treatment))
before_drop_t <- as.character(nrow(data))

data <- data %>% filter(!(analytic_id %in% abnormal_treatment$analytic_id))

after_drop_t <- as.character(nrow(data))
  • We noticed 11 instances where participants received a treatment assignment but had missing values for the country_charity_coded variable. We will drop these participants from the dataset.

  • Before dropping, we have 47450 participants in the dataset. After dropping the participants, we have 47439 participants in the dataset.

data %>% group_by(arm_coded) %>% count(main_cause_coded) %>% kable("html", col.names=(c("Treatment Group", "Main Cause", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Treatment Group Main Cause Count
Defend the oppressed and marginalized 948
Eradicate hunger and homelessness 1941
Eradicate poverty worldwide 317
Heal the sick 1063
Protect the animals 1002
Rescue the environment 603
Transform education 657
NA 29721
control Defend the oppressed and marginalized 294
control Eradicate hunger and homelessness 710
control Eradicate poverty worldwide 162
control Heal the sick 296
control Protect the animals 383
control Rescue the environment 230
control Transform education 172
control NA 3
obligation Defend the oppressed and marginalized 601
obligation Eradicate hunger and homelessness 1439
obligation Eradicate poverty worldwide 308
obligation Heal the sick 629
obligation Protect the animals 745
obligation Rescue the environment 429
obligation Transform education 374
obligation NA 3
opportunity Defend the oppressed and marginalized 591
opportunity Eradicate hunger and homelessness 1441
opportunity Eradicate poverty worldwide 251
opportunity Heal the sick 650
opportunity Protect the animals 691
opportunity Rescue the environment 423
opportunity Transform education 359
opportunity NA 3
abnormal_treatment_main_cause <- data %>% filter(arm_coded != "") %>% select(analytic_id, main_cause_coded, arm_coded) %>% filter(is.na(main_cause_coded))

#store as csv for investigation 

write.csv(abnormal_treatment_main_cause, "./Data/Processed/abnormal_treatment_main_cause.csv", row.names = FALSE)

n_abnormal_treatment_main_cause <- as.character(nrow(abnormal_treatment_main_cause))
before_drop_t1 <- as.character(nrow(data))

data <- data %>% filter(!(analytic_id %in% abnormal_treatment_main_cause$analytic_id))  

after_drop_t1 <- as.character(nrow(data))
  • We noticed 9 instances where participants received a treatment assignment but had missing values for the main_cause_coded variable. We will drop these participants from the dataset.

  • Before dropping the participants, we have 47439 participants in the dataset. After dropping the participants, we have 47430 participants in the dataset.

abnormal_treatment_subcause <- data %>% filter(arm_coded != "") %>% select(analytic_id, sub_cause_coded, arm_coded) %>% filter(is.na(sub_cause_coded))

#store as csv for investigation

write.csv(abnormal_treatment_subcause, "./Data/Processed/abnormal_treatment_subcause.csv", row.names = FALSE)

n_abnormal_treatment_subcause <- as.character(nrow(abnormal_treatment_subcause))
before_drop_t2 <- as.character(nrow(data))

data <- data %>% filter(!(analytic_id %in% abnormal_treatment_subcause$analytic_id))

after_drop_t2 <- as.character(nrow(data))
  • We noticed 16 instances where participants received a treatment assignment but had missing values for the sub_cause_coded variable. We will drop these participants from the dataset.

  • Before dropping the participants, we have 47430 participants in the dataset. After dropping the participants, we have 47414 participants in the dataset.

abnormal_treatment_charity <- data %>% filter(arm_coded != "") %>% select(analytic_id, charity_name_coded, arm_coded) %>% filter(is.na(charity_name_coded))

#store as csv for investigation

write.csv(abnormal_treatment_charity, "./Data/Processed/abnormal_treatment_charity.csv", row.names = FALSE)

n_abnormal_treatment_charity <- as.character(nrow(abnormal_treatment_charity))
  • We noticed 0 instances where participants received a treatment assignment but had missing values for the charity_name_coded variable. We will create a flag abnormal_treatment_charity and generate a spreadsheet to store these participants for further review.

Checking variable directly before treatment assignment

  • We are concerned of random Chatfuel bugs where Chatfuel may not record the responses of participants directly before the treatment assignment. We will check to see if participants who received a treatment assignment have missing values for the immediate preceding and succeeding variables.

  • Variable checkpoint == start_treatment indicates whether participants started the treatment block, we will now check to see if participants who received the treatment assignment have missing values for the variable checkpoint.

data %>% filter(arm_coded != "") %>% group_by(arm_coded) %>% count(checkpoint=="start_treatment") %>% kable("html", col.names=(c("Treatment Group", "Checkpoint", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Treatment Group Checkpoint Count
control FALSE 2024
control TRUE 216
obligation FALSE 2800
obligation TRUE 1721
opportunity FALSE 2798
opportunity TRUE 1603
  • We noticed very high number of participants who received a treatment assignment but have missing values for the variable checkpoint. We create variable abnormal_checkpoint_treatment to flag these participants and a spreadsheet store these participants for further review.
abnormal_checkpoint_treatment <- data %>% filter(arm_coded != "") %>% select(analytic_id, checkpoint, arm_coded) %>% filter(checkpoint != "start_treatment")

n_abnormal_checkpoint_treatment <- as.character(nrow(abnormal_checkpoint_treatment))

#store as csv for investigation
write.csv(abnormal_checkpoint_treatment, "./Data/Processed/abnormal_checkpoint_treatment.csv", row.names = FALSE)
  • We noticed 7622 instances where participants received a treatment assignment but had missing values for the checkpoint variable.

Checking time variable

  • In this part, we will create time duration variables.

  • Currently, in the Chatbot we have the following time variables:

    • charitable_intro_start_time : time stamp when participant entered the chatbot
    • charitable_intro_end : time stamp after participant saw the statement “Awesome! Let’s find your charity soulmate”
    • charitable_match_start : time stamp when participants began the charity matching quiz
    • charitable_match_end : time stamp when participants finished providing their responses for the charity matching quiz
    • charitable_affirm_start : time stamp when participants started answering the affirmation questions
    • charitable_affirm_end : time stamp when participants finished answering the affirmation questions
    • charitable_reveal_start_time : time stamp when participants started seeing the charity reveal
    • charitable_reveal_end : time stamp at the end of charity reveal
    • charitable_treatment_start : time stamp when participants got assigned a treatment group
    • charitable_treatment_end : time stamp at the end of the intervention
    • time_since_first_start: time started the chatbot since the experiment began in days
    • time_since_consent: time conseted since the experiment began in days
    • time_since_match_start: time started the charity matching quiz since the experiment began in days
    • time_since_intervention: time started the intervention since the experiment began in days
    • time_since_reveal: time started the charity reveal since the experiment began in days
    • duration_intro : duration of the introduction stage in minutes
    • duration_match : duration of the charity matching quiz in minutes
    • duration_affirm : duration of the affirmation questions in minutes
    • duration_reveal : duration of the charity reveal in minutes
    • duration_treatment : duration of the intervention in minutes

Organizing time since the experiment started into time blocks (in days)

# converting start tine to better format

data$charitable_intro_start_1 <- as.POSIXct(data$"charitable_intro_start", format="%Y-%m-%dT%H:%M:%SZ", tz="UTC")

data$charitable_intro_start_time <- format(data$charitable_intro_start_1, "%Y-%m-%d %H:%M:%S")

data$charitable_treatment_start_1 <- as.POSIXct(data$"charitable_treatment_start", format="%Y-%m-%dT%H:%M:%SZ", tz="UTC")

data$charitable_treatment_start_time <- format(data$charitable_treatment_start_1, "%Y-%m-%d %H:%M:%S")

data$charitable_intro_end <- format(data$charitable_intro_end, "%Y-%m-%d %H:%M:%S")
data$charitable_treatment_end <- format(data$charitable_treatment_end, "%Y-%m-%d %H:%M:%S")
data$charitable_match_start <- format(data$charitable_match_start, "%Y-%m-%d %H:%M:%S")
data$charitable_match_end <- format(data$charitable_match_end, "%Y-%m-%d %H:%M:%S")
data$charitable_affirm_start <- format(data$charitable_affirm_start, "%Y-%m-%d %H:%M:%S")
data$charitable_affirm_end <- format(data$charitable_affirm_end, "%Y-%m-%d %H:%M:%S")
data$charitable_reveal_start <- format(data$charitable_reveal_start, "%Y-%m-%d %H:%M:%S")
data$charitable_reveal_end <- format(data$charitable_reveal_end, "%Y-%m-%d %H:%M:%S")


first_started <- min(data$charitable_intro_start_time, na.rm =TRUE)

data <-data %>% mutate(
    time_since_first_start = floor(as.numeric(difftime(charitable_intro_start_time, first_started, units = "days"))),
    time_since_consent = floor(as.numeric(difftime(charitable_intro_end, first_started , units = "days"))),
    time_since_match_start = floor(as.numeric(difftime(charitable_match_start, first_started , units = "days"))),
    time_since_intervention = floor(as.numeric(difftime(charitable_treatment_start_time, first_started , units = "days"))),
    time_since_reveal = floor(as.numeric(difftime(charitable_reveal_end, first_started , units = "days"))))

Dropping participants entered the chatbot after 12/31/2023

  • We will drop participants who entered the chatbot after December 31, 2023, or 34 or more days after the experiment started.
entered_later <- data %>% filter(time_since_first_start >= 34) %>% select(analytic_id, time_since_first_start)
n_later <- as.character(nrow(entered_later))
write.csv(entered_later, "./Data/Processed/entered_later.csv", row.names = FALSE)


before_drop <- as.character(nrow(data))

data <- data %>% filter(!(analytic_id %in% entered_later$analytic_id))

after_drop <- as.character(nrow(data))
  • We noticed 308 instances where participants entered the chatbot after December 31, 2023. We will store these participants in entered_later.csv and drop these participants from the dataset.

  • Before dropping the participants, we have 47414 participants in the dataset. After dropping the participants, we have 47106 participants in the dataset.

Looking at distribution of entrance since the experiment started

ggplot(data,
       aes(x = time_since_first_start)) +
  geom_histogram(binwidth = 1, fill = "skyblue", color = "black") +
  labs(x = "Number of Entrance Since the Experiment Started (in days)",
       y = "Count") +
  theme(legend.position = "none")

Creating time duration variables and checking

data <- data %>% mutate(
    duration_intro = as.numeric(difftime(charitable_intro_end, charitable_intro_start_time, units = "mins")),
    duration_match = as.numeric(difftime(charitable_match_end, charitable_match_start, units = "mins")),
    duration_affirm = as.numeric(difftime(charitable_affirm_end, charitable_affirm_start, units = "mins")),
    duration_reveal = as.numeric(difftime(charitable_reveal_end, charitable_reveal_start, units = "mins")),
    duration_treatment = as.numeric(difftime(charitable_treatment_end, charitable_treatment_start_time, units = "mins"))
                       ) 

Checking time duration

  • We now check for negative time durations and create a flag
data <- data %>% mutate(is_abnormal_time = ((duration_intro < 0) | (duration_match < 0) | (duration_affirm < 0) | (duration_reveal < 0) | (duration_treatment < 0)))
abnormal_time <- data %>% filter(is_abnormal_time == TRUE) %>% select(analytic_id, duration_intro, duration_match, duration_affirm, duration_reveal, duration_treatment)
n_abnormal_time <- as.character(nrow(abnormal_time))

before_drop_time <- as.character(nrow(data))

data <- data %>% filter(!(analytic_id %in% abnormal_time$analytic_id))

after_drop_time <- as.character(nrow(data))
  • We noticed 702 instances where participants have at least one negative time duration. We will store these participants in abnormal_time.csv and dropped these participants from the dataset
  • Before dropping, we had 47106 participants in the dataset. After dropping the participants, we have 46404 participants in the dataset.

Checking for time sequence

  • We now check and create a flag for participants who have a time sequence that is in the correct order. To do this, we will look if participants has an earlier timestamp for attributes that appear later in the chatbot.
  • Variable proper_order == TRUE will be created to indicate if the time sequence is in the correct order.
data <- data %>% 
    mutate(proper_order = ifelse(
  time_since_intervention >= time_since_reveal & 
  time_since_reveal >= time_since_match_start & 
  time_since_match_start >= time_since_consent & 
  time_since_consent >= time_since_first_start,
  TRUE, 
  FALSE
))

data %>% count(proper_order) %>% kable("html", col.names=(c("Proper Order", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Proper Order Count
TRUE 9495
NA 36909

Checking free text responses from treatment groups

  • If participants were assigned to the opportunity or obligation arm, they were asked to imagine talking to opporuunity prompt or obligation prompt respectively, and to provide a text response to the question, “How would this make you feel?”
  • In the raw data, these responses are stored in the variables treatment_FR and treatment_RF respectively.
  • We will create a variable treatment_text to combine and store the free text responses from participants in the opportunity and obligation arm.
  • The following two tables provide some samples of responses for the raw treatment_RF and treatment_FR variables.
data %>% select(treatment_RF) %>% kable("html", col.names=(c("Response to Obligation Text"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Response to Obligation Text
I would feel like bringing them home
Guilty
Helpless as I wouldn’t have an answer
I don’t support Africa wild life
Uncaring
It definitely wouldn’t make me feel good about myself
You are no help! I would feel useles.s
Terrible and give thrm a room to live in till i could get them settled
I would feel so heart broken because I kinda been in that situation but I would try to help any way I can
Very Sad, and wishing I’d done something to make a positive impact
Lousy
Angry
I would worry that there would be a safe place for this amimal 
I would feel horrible and that I am not a caring person.
It would break my ❤️ but il try my best that those children get something to eat
Sad. That I. Had. Not found a charity. Earlier I
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX-k6AxO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDYqif93WRi-Plmx_K9w6z5ne0pu_TD2YVtMBAlq8M5cg&oe=656A284B
I know I do this everyday
Guilty
done
I’ll be upset, I would ask her to pack her clothes and take her to the bus station
Sad
Awful. I would make sure the animal had a loving home
Bad
I would feel awful if I couldn’t help that’s why I keep canned goods in the house for anybody that needs some I can always give to them
I would feel horrible
Sound gra t
Horrible
Humbled and thankful
Having been a teacher in this situation, I cannot tell you how wonderful an experience it is when a child learns to read and how sad it is when they are unable or unwilling to try.
I want to help you. What are some of your thoughts on things you want for your child and yourself
i would imagine what they might say to me
Good
terrible
I would take them into my home.
The lions den has been there all along man intruded into his den.
Not sure probably bad but wouldn’t know how to help
I would feel compassion for the young man and I’d also feel protective.
It would make me feel uncomfortable
sad
Horrible
Very, very sad
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX8Xjl8y&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDNOllEa7MbM9EqLbcTjW6Xy7i06bu6eRtsXaveb5Vfiw&oe=657DEECB
Please don’t send me there adopt me
Terrible
Why did you let this happen and you did nothing to prevent it
And 76 years old and I do as much as I can to make sure people get fed like dumpster diet I go talk to people about giving food to the elderly I get clothes and do things for people that maybe families can’t do but I’m getting old and I’m not being respected for it anymore
I give now to special Olympics, do a car show for special Olympics and I work with people with disabilities
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX_kWWwj&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfA9bZJb-DMJGiFsfnKO0fzdxKeo8KRxMaWmJwbU313inA&oe=656C228B
Good
This is my yard, not yours.
Good
It wouldn’t good
Teamates and coaches need to accept all players.
Well wait a minute I want to help you don’t have to guilt me into it.
To always have a roof over there heads and heat
I do not feel a direct obligation to do anything. The wording ““- and you do nothing to help her find shelter”” is somewhat odd.
Take her to a shelter
I help people all the time
Well I tell her that a child is a gift from God and get everything she needs and seek justice for her unborn child
I will help you
Terrible
Start the hunt!!!!!
Badly
My mother is a teacher and my sister is a teacher so I have first hand exposure to what teachers really get paid, what it is really like being a teacher
I would ask them if they needed a place to syay
Terrible
It would make me feel bad
I dont have one.
Awful .. I would help
I would do hreat
I will feel bad
I am a retired middle school teacher who taught students from inner-city neighborhoods. I plan to look into Girls, Inc.  Thank You!!!
Like crap I would find some place for her to go
I worry about my mom all the time. I get food and cook for her
It will make me feel totally awesome
I would feel sad for him.
Not sure of my answer…..would have to think a long time about it….
I would get get basic needs than go from there Do my best to be of help
I wouldn’t feel anything. I would call security!! This. Test is bogus
You are useless
I would never do somthing like that.
Stop
Can’t help don’t have too much income
I would offer to take care of the fur baby
I will feed them and take them to a fire house
Hey I help out in my neighborhood help feed the hundred people home work anything I can do to help me and a friend of mine takes two to Grandma for you that’s all I can do thank you and I’m so sick I can actually thank you
False
Very good
Dad
Sad
It would be a miracle
I would be honored if he trusted me with his most important feelings and I would be happy to help him in any way I could help him and or his family
Bad
Bad
Tracheotomy
I AM that pld woman with a dog on her lap…worrying
They might say they have a baby or young children who are hungry.
Happy 😊
Like crap
I would be upset 😔. I would like to know that my work that I worked so hard for doesn’t have anything to hope for.😢😥🙏🏾❤️🙏🏾
Bad
Goodnight
Bad
This would make me sad to know that she thinks the dog is going to bad hands after she is gone
I would feel terrible if I didn’t help
I would tell her that we are here to help others and I want to help.
They would beg me to help them.
I would feel an immediate need to help them and would feel bad that I didn’t
Bad cuz he helped us
Bad
Sad for those people my heart goes out for those people
Good
I would feel bad for him, cuz in today’s world, it’s a short struggle and I would try to help him with places he can go to help him an his family out. And them resources are getting very scarce as well
Awful and very sad
I would never do that
sad
Angry there is no help for her
Selfish
I would have to help him. He gives his life every single day without even thinking a out maybe he could die to day I couldn’t just walk way I’d have to see if I could t help him get free medical at least for a unute
Nunya - as in Nunya Bidnez.
https://www.facebook.com/GWSAPPALOOSAS/posts/pfbid06NBhrw8kVcdpMp6dDCF2x6FJ5ATSKjYJLrunodx9TUatn2rvBnVcdNMYFi7gnDcYl
I could not do nothing, that’s not me. I would probably take her home with me until we find a program to get her & her child in. I’ve done that before.
I am in her place right now. Me and my son don’t have a place to live. We are staying with family. But it’s not our place.
I’m 60 years old and homeless and in bad health
Son I am old and have next to nothing but I will take the adviceof those who will lead me to help you ant way I can.
I would feel terrible
I would help him
I would feel terrible for him, and most definitely would try to help him get him some type of job, even if its just doing yard work for cash.
How much will it cost me
Desperate to help him/her
Angry, helpless, betrayed
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX8Xw1kM&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCewedYHqNaViIYNv-Z8AkzLkqT92IwjU_8ZfRmeR1bDw&oe=6570170B
Hurt
Look for ways to connect that family with others that have an appreciation of reading.
I can help
I will feeling so sad for them
Sad
I would definitely help her find a place to live
Shame on you. Greta
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX9twngU&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDQy__Uuxg3eEPTUe2gvlXQ6_XoaaGU6dYCf-3lJWB7ig&oe=6570170B
I woodfield seal awful I would be sad I would try to help this man even if I had to reach in my pocket to give to him it would be just terrible I would try to help him
Make me want to cry
very sad and I know how that is because my sister daed in front of her kids with a heart actack
I would feel awful and feel like I would have to make it right
This would make me feel very sad
Bad
I understand because I that young woman once,whom the government would not help at all. I really feel for children or anyone who’s hungry
I really don’t how I would I guess be all right with me
It would make me feel terrible because people would be disappointed in me
They might say ““I want to go to college when I grow up but I don’t know how I can.”” It would make me feel sad in some ways but also make me happy that he/she has a goal and a challenge. It will also make me understand ( as I grew up poor) as I worked most of my working life with low income children. I believe in children and believe all children can learn but I also know that schools and teachers are not what they used to be.
I would feel horrible
It will make me feel Horrible
I would be the first person to bring her and her baby home with me
I’d feel pretty bad. Like I let my grandsons down
Thankful
Very. Sad
Feel bad
Sad
Heartbreaking for me when I see homeless people in my community I try the best way I can to reach out! Do something instead of nothing!
Awful
Good about myself
Very out raged
I would feel shi
Rescue her dog
The choices given didn’t include the direction I would pick or I didn’t understand. I would always help the veterans first.
Want to go to my house
I miss understood
I may not be able to pay for him,but I would be asking if some one else could. And also Jesus uses me to pray for people to be healed .
I’m out of this thank you!
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX_6Naml&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDBF-JSFLLzK_F6vcmkd0foBtvHPxD5bxohrQuVqKw6xw&oe=6570170B
It wouldn’t happen because I would make sure that I gave her food even if it was mine
I understand poverty
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX84EYZA&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAxw0O-pDfM-oevQP2eM5xkda8KsZ1DxzhSwwRUkXNCBA&oe=6570170B
I would have to help. That’s who I am.
I would help him that’s how I am.
I’m a person who
I wld fell sad that I didn’t and try a way to help
Awesome. Thank you. Like a million bucks you deserve to be healthy and have a good life
If I didn’t help I’m a terrible human being.
Look what I tell you us true
Lousy
I would own the errors of my ways and explain that by understanding the grave oversights I engaged in that I feel more than ever the Urgency to make up for lost time.
So feel bad
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX8SD7ZO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfCQthzTIYlE7-ooGDJJPskGmKDAxh-TIyoK5Zz0sjFl7A&oe=6570170B
I have been in that position a few times myself so think I might have a couple tears in mind if that was to happen in front of me
If they don’t have the money how will they have nutrition to survive if they don’t have a job or no resource that’s coming in to help them and people living in this world today doesn’t care about someone else feelings hungry thirsty or whatever but the government should step up and do better for the people and the people need to step up and do better for each other
I would feel guilty because I didn’t follow through with my desire to save the families if these beautiful and amazing animals
Good
Sad
Ya I’m not donating any money ,I have taken in so many animals and payed for it myself. Also I have 4 homeless Children living with me right now, anyone want to donate to me for the children ??
I will feel very sad because that’s a way he feeds his family and love ones just like the old says do as to others has you will like done un to u .
Horrible, I’d get some garbage bags and gloves and ask my grandson to help me clean.maybe we can’t do it all.. but it’s a start
Upset
I would tell her that we can talk about it and go over the choices that she has
Please unsubscribe me from your organization I’m not interested thank you
I would feel ashamed
I would not leave them alone I would have them with me
sad
I already give to Israel thru Church of God
I’m done
Sad
Only I Would Do What I Can To Help.
Ok
I really love kids I got 4 of my 2 grandkids I try to teach them the right thing in life ok
At peace
bad
I know people with cancer
Stop
They may ask for money. Very sad I just hope I could find them room
Sad
I am not sure what they might say but I wold want them to know they are not alone.
Let’s get you a warmplace to stay and something to eat
mad
Please give me a chance, I am a good worker and I learn fast give me a chance to learn
Sad, guilty
Do my best to help find housing
Well I am 67+1/2 years old now, and how I’ve rescued many innocent animal’s through out my life here on this earth,yet if I were in Africa and a lion got hit by a car, how it depend on the Lions injury’s,if it can be saved then how I’d do everything within my power to find another place for it to survive,heal from it’s wounds,it of needed to see a Vet.doctor first.And if the Lion was run over by a car in the hunting area maybe it be best to leave well enough alone, how I do know that I’d not want to get eaten up by other Lions, and neither would the animal rescuer in Africa.Its a tough decision call to make.Plus the innocent animal’s that I’ve rescued through the years I’ve been living on this earth none of them were the size of a Lion.
terrible; guilty
would make me feel inadequate and selfish
I do donate to ASPCA
🥰
I would see myself 20 years ago and would want to give them a hug.
Who I do not have a lucy
First of all I would d find a new owner for the pet.
that would never happen because there are so many resources locally to help sustain esp basic needs at first
I would feel like I need to do more and try to find a way to help her.
Heartache
It will mean a lot to me and my soulmate I love him. And I want the best for us both.
I would ask him what his hobbies, were,& incourage him to look for any job to get bye & prayed bills & don’t be afraid to go look & be yourself & dependable as been at the factory job a long time. Put yourself out there. Don’t get discouraged if don’t get first job you apply for. Will have to do many different jobs before the right one comes along & prayer to our God almighty can help.
I couldn’t do nothing. I would do something.
I said that I don’t have any time for you
No thanks
Feel bad
I would like to be able to make a direrencein life together with all of us helping us together
You tell me
I would reassure him or her there is hope
I will try to do all I can to help them
Really don’t know???
I’d never do that but If it did happen I would be devastated
Good
Awful
Great
I will try my best to help them. If they refuse my help then nothing I can do. Will help those who need and accept my help
Not good
SO GREATFUL
It would make me very sad I have a cat named Lucy
Good
Very good
Sad
I would feel very upset because I did nothing
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX_uMfJH&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDPchHXhkLqoTEeNqi6XL-H5_mFPsUPHNjKRzBawfyh1A&oe=657605CB
couldn’t do it
I would feel sad. But I would tell them I would be.glad to read to you. Don’t worry I don’t know all the words in a book.
That is so devastating. I would feel horrible & want to help more.
I would help
I think I’ll stop here.
Bad for them
Rotten
Happy
Very bad
I would never walk away from a situation like that, I would go get food for them
I,’,d be extremely upset that they have no home to call their own!
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-fgxcM&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAdSetzGr7se_0M6mSFaluVWXLhpnEZsbOGzvuWZuktWw&oe=658BC68B
This would make me feel sad. I would never not give her food for her child and herself too.
I will feel scary for awhile
angry. perhaps a bit guilty
No questions asked I would want to take care of the Lucy. It would break my heart if she were to be put it in a shelter… She might die there
Very sad
I would feel bad
What ??
They would say that we (old ones) are the ones that caused the problem. But they are the ones that have to live with the results of the greedy, glutinous behaviors. They would promise to leave the earth in better shape when. For there grandkids.
I already set something up. I chose two families. They both said yes. One family is the family who gave her to me. The other is just husband and wife who loves cats. They have two right now.
Sad
I would get them something to eat
let us go to the food banks and get what all you need.
Awful
I would try to help them with what I could do for them.
If I don’t have enough for me then how can I help you
Hopefully like I did something that matters.
It would make me feel awful so I would have to help him
Sad
Aweful cause i would want to give them food
This is such a injustice and I have been there and I feel the pain becausethose shoes are hard to fill.
What type of books would they like to read
I would tell her I will take care of your dog 🐶
I would feel compelled to help them. I have been in that situation and I would tell them my own experience strength and hope and where I am now at tiday
I would calm them and help them calm down so they can forgive and forget.
I will help you
I would feel very bad. I would love Lucy to have a happy home always.
I would feel really sorry for them all especially children
Awful & Terrible !!!
Desperate
I already belong to the ASPCA
I would offer them a stay at my home till we get something figured out
Very sad….but to supply the book(s) is only a PART of what I would do. Children need a solid program (like phonics) and a solid educator to be successful. Also the parents need to be involved much more.
It make me feel bad yes
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX-INiMa&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDkpY96fGXMKc9Wd0NY9URXTryw7pc0dGPnu0ChmIIKzQ&oe=6583DD8B
Skip
Sad
your stupid
I would feel very sad; I would want to help guide them with resources that can help.
Having been a teacher, it saddens me. But to know the teachers are willing to subsidize their classroom projects is what teaching is all about. Or what it should be. Teaching involves supporting the students. And the teachers I have known are first to make sure their students have what is needed.
Not very good
Very good!!!
I’m blessed when I can assist someone else
I would feel sorry for her and her child i would want to help her find a safe place to sleep with her child
i am homeless can you helpme please
I thank if we just Love each other.Look kindness to others.
I have been that young mother. I don’t have to imagine.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX-cvmVY&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBXbmA4gtb0J5cSOL8Sjzq4_TC2bWE738UQjlSUVylRIA&oe=657BF48B
It would make my heart hurt.
Never gave th if s a thought
That would.wrong for some one not to give the child food
First I would do what I could to help the lion
I would feel guilty
Awful look for another job he may qualify for
Indolent
Dont know
stop
😭
neglectful
Ì will get Back with you when I’m able to help with them
Not to bad
1/ I have had this talk with my grandkids when I had trees planted 2/ We want on line we looked at what animals lived in the forest they even want to school and talked to the teacher about this and she did lesson on also
I would be very sad
I should help him all I could
It would make me feel terrible. On Fridays 3 of us did Fri with donuts with in a housing project
I would try to find Lucy another loving home This would make me feel some type of way because I know her fear.
I am in hospice and please stop sending me these questions ….
End
leave me alone!
I wish I had the education I might have been able to doore about that problem
Not good i
They would probably ask for assistance. I would recommend agencies, resources available to assist them.
Happy and content
I will help you
Sad
Please help…I would take her to a shelter. Make sure she is provided for
Awful
I will do my part as a family provider and a husband material
I would do something.
I am assuming it would make me feel awful for them
What was the wuestion
Sorry I didn’t tell him or help to find more information.
What I would say, I would just feel horrible
I can’t imagine not doing something for this woman with child. I would take her to a food pantry or a grocery store and help her fill her cart with healthy food.
I would feel so unhappy
I would be mortified!!
Not all places of business are receptive to AED. They hesitate because of possible lawsuits, the snout of time to educate their staff. Or possibility of the staff being able to follow directions
I don’t know
THIS COULD NOT BE ME I WOULD HAVE TO BRING THEM HOME WITH ME. I WOULD HELP HER I LOVE BABY
Sad
Concerned
Terrible and hurt with being sad
It would brake there harts I was that kid never had $ are a teacher to take the time and teach me how to read because I was not able to hear out of my ears growing up therefore teachers would not take the time to teach me properly how to read and write therefore it calls me to not be able to learn properly that is the lack of teachers teaching their classes and learning their children’s disabilities and their strength and their weakness that falls back on teachers not caring enough about their jobs and being able to let these children thrive and push them to the max of what they’re capable of being in this world and being able to achieve
You would have to take a good look at this picture . You need God’s help
Not surprised at all are medical systems sucks
My grandchild is 33 years old she’s well aware of what’s going on in our country it’s terrible and it’s sad there is many things to be aware of not just focusing on that charity there’s many charities that need to be focused on and needs to be brought up and taken care of especially for the homeless animals and caring of them these nonprofits need to be a non-profit and quit profiting off the dogs and cats it’s ridiculous and the spay and neutering is ridiculous especially in Yakima Washington I have never been to such a terrible state in my life that people don’t stick together and come together and have clinics and stuff for low income in the homeless people so they can keep their animals I see so many dead animals alongside the street and they don’t care they just keep on running over
I would probably be in tears
I would feel sad and I would tell the old lady not to worry that when the Lord takes her home I will take Lucy and take care of her as she is my own
Stop
I would not do nothing I would help in any way I could
I can identify with both of these charities as I already give to each of them & also to a couple of horse charities.
Blessed
I would feel sad.
my church is involved with shelter; so i know all about it, thanks
No thank you I just lost interest.
I would be very depressed if there was nothing I could do , I would take food from my own home to them if I couldn’t find a place to help
God bless you I am 79 and have Parkinson’s and other issues. I carry bottles of water in my car and large baggies with snacks, socks, wet wipes, and $5. I am on a fixed income and have difficulty paying utilities to my house. No one should be homeless in the United States
Ashamed
I would tried and help her
Oh no
n/a
If I fail to recover from this setback, the impact will be felt on my family for generations. How could you not help?
Irealywhouldfillhurtandletdown
Horrible I would do my best to find them shelter.
Awe
Sad
Terrible
I will do everything in my power to help him above and beyond
I would feel very guilty for not helping feed someone hungry.
Very bad
I wouldn’t know exactly what to say
I can nit answer this question with a fr mind because I and my son and daughter will be homeless soon acctually evicted soon so I dont think this is rt for me
I would try to help him get back on his feet.
I would feel as if I had personally let them down. I would hate the thought of parasites sapping their life force
It would be so sad
Sad
Very sad and un professional
I would have this lady her her baby and help her with whatever she needs
Sad, horrible, and sad
Feel like crap
Good
I would help her
SAD
It would hurt me to know that I am not doing what I need to do
I would have to get familiar with the situation and option before I can answer intelligently.
how can I help
Oh.I see.
I have one of those dogs. A friend of mine let it be known that there was a dog at the humane society who was surrendered by a 91-year-old lady who had to go to a nursing home. The dog was 11 years old. I went out to meet her and she went home with me. I am trying to get the humane society to arrange for me to take her to visit the lady.
I can take her when your’re gone
Terrible because I get him help.
It will make me feel sad
Bad
I will feel guilty because I would like them to live in a clean world free good air. Free from sickness.
💔
My grandfather died from a third heat attack when I was 7 years-old It was 5 years after my father was killed on his job at the age of 28 . My mother was in tears that day because her daddy was dead from the heart attack
They would say I don’t care! I would want to die! But that isn’t me
I am the kind of person that loves To see people happy and healthey.
I would help anyone if they needed help
https://scontent.xx.fbcdn.net/v/t39.1997-6/393821011_908962743919044_228092346710583890_n.webp?stp=dst-png_p100x100&_nc_cat=109&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=dNE4fOboSREAX8_JXhm&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDn8ivPw3XdBCrYhbYIsKQbkWrkMyiRA7bfHUqGDHVLuA&oe=657AD768
I would feel terrible
Been there many times myself and get the Sr box every month
Happy
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX-fXPrB&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAkDjHkOfxBMvUcPbmoxoxqAe-PaiJitAM5C-RO8eWZ7Q&oe=6578000B
Pretty low and rotten
Bad a little guilty
Helpless
I would tell her God is with you and I am to I would make sure she takes Jesus christ our savior just in case she passes away I know she will be in Heaven
would be sad.
All things work together for the good of those who love the Lord 🙏 GOD will work it out just Pray.
I would feel glad I was there to help him. I did my job as a human.
Bad
My young grandsons are very witty and would tell me what they think instead of the other way around.
14in dick full of cum
Thanks
Very unhappy
I not interested talking bout no rain fronest
It would make me feel bad for the man
I don’t know
Id want to help as much as I could.
Me not helping! I would kick my arse
Sad, angry
Sad
Awful
I would tell them where to go get help
This wouldn’t put a big hole in my heart, bcuz it could b me and children of starvation
Feel terrible
It would make me feel guilty and would probably adopt Lucy myself.
Very hurt that I couldn’t help him financially
I’ve been in that situation myself and I would go without just to help a young mother be able to feed her children along with herself so that she may continue to take her of her children
It would make me feel very bad. I am not in a financial situation to help her. We have so many millionaires in this country that could be able to do something
Unhappy
Horrible really horrible
Appalled
Real bad
I’ve been very blessed I’ve had no chemo I’ve had no radiation for some reason I didn’t need it I guess I got one of the best on ecology cancer doctor because she has done a great job in that document took out the stomach cancer I had and how are you and thank God that he was able to fix my rips to make wall and put my intestines back in me and now I’m digging my way out of this hole because what they give you for social security 9:30 a month make it hard to live on so how does this charity help people that really need it
Try again next year
Very sad. I’d take them home w me
Feel very badly.
No
ashamed
horrible
Very sad
““Will you please feed my child?”” I would feel devastated that I hadn’t already helped her
Believe in God, everything is possible
Good
It would make feel less of a person, know God makes no mistakes
Like I am into a Logos, Pathos and Ethos argument
help help
I would want to help them
That would be wonderful to be able to help someone like that!!
I don’t have grandchildren. I have lived in accordance with the concept of Zero Population Growth.
First of all, I don’t know a kid, except the ones that live on a diary farm that even know where their milk comes from. 2nd, cows are working animals, so I am not interested in that area, My concern is dogs, cats that come from a lab and are used for testing. My dog sitting right next to me right now was a rescue and has many issues because of the way she was treat and abused by her family. That is my concern
I would feel very concerned
PRETTY BAD
Would make me feel bad because I wold like to help
i would tell him that a disability shouldnt hold him back from achieving his goals and dreams and nobody has the right to treat him like that
The same
Very sad,cause I worry about my own pets. I would try to find Lucy a living family and home.
Reading is fundamental to future development and success
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_8m1S3&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBddEcN9g-JECotDib7iAB82mhn7y5pugZiP1cwdUNi8A&oe=657BF48B
All Full
Wonderful
They will need my help at the moment and because am not able to help them coz of my situation I will feel very bad about it
Somewhat good
I would feel so bad. They need help to take care of there family.
it would make me feel Real Bad
Why won’t you help us you can see we need help with this please help us
Bad
Terrible
It’s hard for me to imagine that at all
I would be very sad about it
Great
When I get my dream I can give them nice places and edto live specially with the children and give them education hot food.
Help then
What can I say?
First of all I would try to help even dough iam in the same situation myself
Id help her fine a home for her animal so she don’t worry as much
I am not the person to do nothing…I would be able to provide info on community resources.
We have a food pantry here in town that can help you. I know the person that can get you an emergency box right now.
wow
Mad
That sound good thank you
I have been that young mother many years ago so I know how that feels and I was so very grateful that I had friends that was willing to give me a hand so I would in turn do the very same thing if I was able to do so if not financially I would you know figure out a way of transporting them to a food bank to where they could get some food
Sad. Frustrated.
I would feel bad than whatever it takes to find out what to do?
Greatful
Everyone would be eating for they learned how to achieve all of the items and still have some to share.
God help this lady
I may not be in a position to help
Oh I already have 2 adult children who are homeless.
Very Sad
I’d feel bad to not share some of the things I’ve been blessed with.
I would take Lucy home with me after the owner pass way.
i don’t know
I myself would feel horrible. Everyone needs skills, job training
The reason I am interested in The Dana Farber Cancer Institute I am an 26 year Cancer Survivor. I can relate to Women or Men that are being diagnosed with Cancer.
Bad. Let’s take this up later.
I would take her to the store or go myself and give what I could.
cAN YOU HELP ME?
I love him
sad
I don’t know
My husband and I both lost our jobs at once back in the 70’s. That’s scarry.
Feel amazing
Terrible
Aweful
I would feel compelled to do all I could to help her and the family
CONCERNED
It’s breaks my heart 💔💔💔 to think that it happens on the regular today. And I think by the time my grandkids are of age to understand all about what goes on in the wild with these animals . I don’t think my grand babies will ever see an elephant in his time. The catchers are out there cutting there tusks and selling them to make ivory out it. And they do it for thee all mighty dollar. This is a very sad world 🌍 we are living in today. We NEED JESUS NOW!! RIGHT NOW!!! AMEN!!💔🙏🏼🙏🏼🙏🏼🙏🏼🙏🏼🙏🏼🙏🏼💔
Yes. I. Would. Never. Let. Them. Alone. Give. Them. A. Place. To. Stay. I. Know. How. It. Feels
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX9ss0_Z&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBoH9czkkaQOSE7rwqA5m3gEMrunqyPQuDzhD1DCUxZ-Q&oe=657BF48B
I would feel very bad and want to help but I don’t know that I could.
terrible
I would feel terrible and want to help
sad.
I would say keep your head up and pray
Omg .
I would try to find a pl for them tonight and help long term tomorrow
Don’t know
Very low and like I have to do something
end
I don’t know
Pretty lousy, I suppose
Very sad
I would try to find someone who can take of Lucy so she will have a happy life and a lifelong friend
I would tell them to sign up for a library card where they can get all the books they want to read for free
A ok
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX9QiEHu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDtss252jTTiyAfUiYfTSHYWMaDxTFERTVGA40AIme1_w&oe=657BF48B
ugh.
I would feel terrible. Loses his job with no opportunities for a new one.
I would feel good. My husband had cancer and through a lot but he didn’t survive.
I WOULD TRY TO FIND HER PLACE
Horrible & helpless
Lets say this if i knew someone was hungry i would feed them .. if i had a job and they could do it i would let them work… and train them… so does that answer you question
Im too ou spoken and not shy
It would be very rewarding.
Not sure
Sad
sad
Great
It would make me feel helpless
Can’t leave them there have to find a shelter
I would get them help to find a job And get assistance from
Very upset
I would feel really sad about this situation 😞
I would speak to them about experience n also looking into job agencies
I would help them to get a shelter
THIS DARN SURE would not be ME. I WAS A YOUNG MOTHER ONCE. I REMEMBER THE STRUGGLE. I WOULD ALSO FEED THE ANIMALS
No one would have to say anything, I would be beating myself up mentally for years to come.
I’d feel crappy if I had ways to help, they wanted it and I did nothing!
Terrible
Good
I would take the dog in…
I think that’s wrong
I help a lot of people
No
What’s the question
I would feel sad
Awful
How can I help you
Helpful
Okay
Let’s pray
What you mean. They would prolly just scream and say ewww. I don’t know I don’t have grandchildren I’m only twenty one
A friend and loveing saport
I would help if possible
angry and empathetic
.sad
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX8RANjN&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDhz_oCjgW0eMvodP6NMEPxSJY1yfLND5KEhcElqxAGmg&oe=657BF48B
Find another job
Flawed premise.
i would feel awful and helpless
Sad
Sad an won’t to feed them
Regretful
It would make me saddened that I could not help them.
Not good
Can’t you help us a little. Why wouldn’t you if you can? -I’d feel guilty and ashamed.
good
I already participate in a program in my community to help people like her.
Very happy
I would hope they wpould know I didn’t do anything to help.
Is there anything you can do? I would feel upset if I did not have resources to help. If i knew of a nearby food pantry or helpful church I would ask if they could get there.
Bad
I did other things.
Kinda sad
Probably
Sad
Happy
It would make me feel like crap I will help anybody if possible
Sad
What is the source of the pollution in Ohiol
Feel bad
Jean
I am confused
Uninformed and powerless
Helpless
I would love to help you, your family, and your community.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_wqxMR&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDIdGnnO4RU2Ye9zvGc58q6kp4Wsz_sp7uUdMIn6PtM3w&oe=657BF48B
I would not recommend she contract aspca
If it were in my means I would find out what their most urgent needs are and map out a strategy to meet those needs.
I would like to take them to my place and get them some food and try and help them out
Heart broken
I WOULD FEEL GOOD HELPING THEM WITH THEIRSICKNESS THAT IS LOVE
Like I was where God wanted me to be. It wasn’t me it’s he who lives in me
I will be so glad that am trying to find a cure for this kind of illness.
If I had known I would have been a better person, and help
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX9gGiTk&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBiXnmd3QO54acLjTBU6-yRxEm8up9Excx1BlslndE7EA&oe=657DEECB
I would be embarrassed
Ime speach less
Very bad
Awful
Terrible and make me very thankful for what I do have
I am willing to help you but you have to prove that you are willing to help yourself and your family. I’m not just giving people handouts I’ve been down that road with other organizations where people don’t want to help they just want to take
Guilty of course
Good
I wish that I could help you for 3 to 6 months financially as long as you are willing to help yourself and your family by attending a trade school that would give me a weekly update on your progress and possibly work a part time job if possible. If your significant other could work, great also if you have teenagers possibly they could help the family as well. Hopefully working as a TEAM / FAMILY, eventually we could hopefully get everyone some time of trade or skill.
Good
Makes me sick
Terrible
Bad because no one is doing anything about it
Ok
Sad
frustrated
I tried to stop the trees from being cut down..but they just pushed an old woman too the side of the road
Number one I would help them make me feel bad if I didn’t
Okay
Nope.
I would ask a few questions to help discover why no books at home. Ask about libraries at school and public. Ask about interests to see how I could help.
Helpless
very sd
I’m homeless
heartbroken
I would be so thankful and graceful for your treatment clinical trial.
Awful
Very depressed
I don’t how I feel
helpless
Heartbroken 💔
Very good
Sad
I have it and don’t know if I’ll have a chance to stop it
I would find her a place to stay before i left her
bad
Grateful
It would make me feel wonderful
Bad
Sad
Like a chump
Sad
Very sad
Happy
Sad
That would make me very sad .
I would not want to hear what they say because I’ve been in that place before myself and just talking and not helping does nothing for the person
Stip
I would volunteer to take her dog
I would feel like trying to tutor them myself, if I could.
awful
Rainforests are kind of abstract for me. I live in a desert. How would I tell my grandchild that I didn’t do anything to conserve the place I live? Especially since there is a non-zero chance that my local ecology will collapse and I’ll be a climate refugee?
I would fell very bad I would help him anyway I could
😞
Helpless
That would be awesome
Been there before
Very bad ,cause I have a 15 month old baby girl and I what want everyone pull together for kids that’s our future
Would do what I could to help her out
angry
Happy
I’d feel terrible and want to help.
Bad
Nice
I would do whatever possible to help
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX8sV4ui&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfDVpJAWiv8zaxKORKplJPCqP9pcxBJ5ZN3fB4WznhxE5g&oe=657FE90B
It would make feel awful I would try and get her into a shelter right away. To be honest with you I work with the homeless now and there are not enough resources for the homeless and not enough shelters.
guilty
Sad
It would make me feel Horrible
So sorry
Don’t know
I’d feel las if I let a brother down. I would want to help.
Sad
A amazing
i would want them to have the opportunity to visit snd see the amazing eonders of the sea
I would feel sad and seek help for her. Many people out there don’t give a ____ these days
😢
First, I always help people I know who need food
Why did you not stop it?
sad
I am on a very low fixed income by the way
I would want to try and help him.
First doctor’s can,t save you it in God’s hands
I would .feel bad let him come work for mel
like a heel
ok
I am happy to look into this organization but I also believe christianity should be a HUGE part.
very sad
Happy
Fuck you
Is important
Great
Makes me sad and kinda wanna start some research on how he could get some training for a new career
Good
Make me feel bad
Because I have limited ability to help except with money, I could not actually help by taking him there. I would give money and hope others could help physically.
Send me the question again
I don’t have no one in the flesh.
I been 13 yrs of homelessness and meet people hopeless, distress, lonely, most of them by their choice, to be alone by thier self the one scary are people who toxic of drugs and alcohol, but every one of them have their own intelligence, i don’t have formal education the most i have is when i certified to get my english is a second language and learn to communicate in the world.
I would take Lucy with me I would give her my home till a good one was found or let her live with me.
I tried
Terrible 😢
awesome
It would make me feel that I am making a difference in my world.
I’m on a fixed income
terrible
Remorseful
https://m.doqxv6.top/a0c6dl5YY0lKBF0GRgFTUQxiVTByEV0OdxgHCUgxAh8bPDE4bRo1RCY3SR4VLRZYDEs_PEcLZy0zUixBcwJDTD0FMANIH1dUFQ&p=mpdims&_mi1703787788936
I would try to get Lucy a home I wouldn’t be able to take Lucy in I got cats myself but I wouldn’t want that dog to go to shelter and if it didn’t have anybody else on her family side I would find a home for her or call shelter
Very bad
Why not, Nonnie
I want to work, but my computer skills were weak. Now I’ve got a new job! Excited for them.
I love reading book that hobby
STOP
I would feel great saddnessand remind me of my many friends and my husband who are firefighters
If I could help I would but if I can’t I would feel some type of way
sad
Sad and sorry course I would like to help the girl
:’(
I would be piss
frustrated
boooooo
Like shit
I would feed them and take them to find decent shelter next step trying to find her a job so she can be in her own place to call home we don’t have decent shelters here we need them desperate
Very sad
Terrible
Helpless
That is good but I prefer a local shelter - Thanks!
I gave story books to kids 1 though 6 yrs old
bad
No thanks
Feel very bad, was let go at my employment. Adopted 2 grandkids sulation is finding the differenc agencies who helps. U how to apply all to places that help. No time to feel sorry for your self
Why don’t you come to my house and discuss this
Sad
I am worried about the same, and pick up trash when I walk the beach. The whole of the natural environment is at risk— as are we and all the animals!
If someone need help anywhere and I don’t help when I can I feel bad
Ok
SAD
I am so sorry that I couldn’t post any sooner than I am. My computer acted up and never let me get back to you all till now. My friend and I started a reading program one summer and the kids loved it. There was this one girl that read at 5th grade level, but she did not comprehend what she read. Her twin was reading at 3rd grade level and she knew what she had read. I would love it to teach any child or adult or even grandma & grandpa how to read. Yes I know what is involed teaching an adult how to read. You see there was an 81 year old man that came in and asked if he could sit with our classes. I had the younger children from Pre-K to the 2nd grade, and my friend had from the 3 grade on up. We both worked with this elderly man that wanted to know how to write his name before he
Ok your own welcome rg I ss is tour ppalabet bow guh
Happy
I hVe no idea
I would feel compassion, but I would also feel some responsibility to help in an effective way.
If I came across homeless Mom and her baby, I would do what I can to help her find the resources needed to provide her with a few nights stay while they look for a place more permanent.
Terrible!
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX9jal40&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBVOq8VvbylhJrSt3KhYJsbv5LR8rDEuD8TSYgM4LyZ-Q&oe=657FE90B
Good
Terrble
I could not sit idle to watch it happen
I feel angry and sad that nothing I do to try to get others to understand the extremely dangerous nature of the problems at hand, and to turn around global warming before it’s too late.
Why wasn’t homelessness mentioned?
I’d offer direction to help himself
Well I would think with the modern world we have way to much technology which is a good thing and bad
I WOULD LIKE TO HELP
relieved to know they’d want to learn and fend for themselves in whatever ways they could
Pleased
It would make me b a selfish low down person!! Offer advice or give info on what I know about places that would help them!! Give money and or food 2 help them
I would feel like I would like to spend more time with that and help them
I don’t want any animal to be lost forever but I’d think the World Wildlife Fund would fit better. Right?
wanting to provide lots of books and teaching her to read
Great
Very 😢
https://scontent.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=CB05twjV2fkAX-y7ekJ&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAtdkWY2-Qe-FNLVS44ExdAZSTVOsXuHmkBI3nUt-eJ1Q&oe=65813986
sad
Sad
Convicted
sad or worrief
I donated to RIF
I would feel good inside but there other channels that would have to help out in her situation too
I have lots of charities I give to. I didn’t feel the need to continue with your questions.
sad
EMPTY
Horrible
It would make me feel like a loser that I wasn’t much of a parent
???
I would feel quite selfish. As a 70 year old I’ve always tried to be charitable to the less fortunate.
Stop
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX9XAoGJ&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC64LyzAjTb6qH-auWPd34qntZ-b9YedokMukzqa7kTxg&oe=6581E34B
sad
I would feel very bad
I will tell her to relocate there. Stay on campus still she’s done
It would make me feel real good
Sad that I can’t help
I support the Salina Rescue Mission and Mission OKC both are local charities feeding body and soul. I volunteered for both ministries for years.
Thoughtful
Helpless
Mad at myself
It would make me feel awefull
Helpless
Number one I would never do that I would help her I’m not the type of person that would do nothing
Awful
Thank you
I’m finished, thank you.
STOP
Humble
We I love helping people I wish I could go back to work
When you have so many privileges, what would it really cost you to help someone who is truly in need?
Thank you, over whelmed
I’ll check them out! Thank you!
very good that i could help somebody in need
I would want to help them, as I have also been in that same spot.
I would want to take the dog in myself
I would feel good about it
Rhanks
Not sure
Hypocritical
I would explain to my grandkids how it use to be so different when I was growing up that they are destroying rain forest and parks
Very bad
Sad
Stop
n/a
As if I could help with a simple donation that could go directly to helping them.
My granddaughter is working on her PhD in Sustainability.
I’ll help when I can.Im elderly and on a fixed income and am raising 2 greatgrand teenagers so I barely have enough to see us thru the month.
Finding a safe place is the most important, after we do that we can find food.
Horrible
I would be sad probably
Thay can’t do ti
Maybe volunteer at an animal shelter
re take test
It’s my pleasure to have helped you.
STOP
I am more worried about Mom and her symptoms being ignored,. There are a ton of grants for AEDs, I have written 4 for soccer and cross country fields
see they know it’s not right but they do it any way!!
I’m not sure how I would during the outcome. For now I’m homeless since 2019 stayed in the shelter for 2 years. Met a friend in there she had cervical cancer off and on she was going to the hospital since I moved out in 2021 I seen her off and on and she recover. SHe had moved from the shelter last year to her new place and haven’t heard her again. My prayers goes to her when I think of her daily.
sad
I am an animal lover so it would hurt me pretty bad to see an animal go to a shelter I’ve had when they went to the shelter and I lost her forever though I know it feels like and no animals should go into a shelter because if they’re there long enough but nobody taking them or adopting them they are going to get euthanized
Of course, it would make me feel like an irresponsible self-serving piglet.
Good
PRAYERS
I wouldn’t do that body
I’ll take Lucy when the time comes. She will become my child
I volunteer at a shelter
I would try to help him find a other job
Bad
Not to good
Terrible
I know. I feel the same way! Who would take care of mines!
Not very good!
Uncaring
Idk
i would feel horrible and want to help
I had a son that I was told that about. But by the grace of God he is still on this earth.
Terrible
It would really make me feel bad for him because I’ve been in that situation before
I would be very upset
I’d make him/them pay
Helpless
First of all, I would try to help them and if I had a place of my own. I would let them stay there for the night or help them find some Shelter.
I already am an ASPCA guardian, so I’m already helping the old lady and her dog.
My grandchildren know I am already engaged in various efforts to address these issues but I will also give some thought to contributing to the Natural Resources Defense Council. Thanks for the recommendation
I’ve been there
Agonized
I would make sure they have books to read
I would feel let down like the guy that just lost his job an his family he needs to support. I wouldn’t care what they said the issue is the man an his family.
Sad
I’ve been that young mother, searching through the cabinets . Now I’m the Grandma searching for myself.
It would make me feel like I’m a person who cares only for herself and forget the one in need
Very Badly
I would be sad and I would want to help them have access to food
?
That would hurt me to my heart if I ever have to tell someone that
Sad but they need a library cards
I would love to work with people and places to help BUT I am disabled don’t get around to well and finance is bad. Not much I can do 😭
Good! Thanks.
I would feel bad
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX8WHIx1&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAeowOkdIJyorkW7PHnZQ-39s4J4hR6gwuKD6G3Pla69A&oe=6583DD8B
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX_Ut4M3&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCFmUTZ7Sn7jCGbMvGEYeOhK8_u7B88jhXw9l96CDlS6A&oe=6583DD8B
I think maybe if I’m going to talk to my grandkids about this I should narrow down my search to the homelessness and poverty situation
Empathy sadness and a want to help them find an organization to help them
I would want to help anyway I could and if I couldn’t i would not feel could at but I wouldn’t give up I would still keep trying
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX8KElPb&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC7wv5KlYyO2tKKuMg3se9CCS-9ZOJJDIR8MwedGNgK3A&oe=6583DD8B
I would able to help you out
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX-VNzjS&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBB2G43H0c-U2h23xvCAnKRRHY1fq-1DD_z7oYminUuOQ&oe=6583DD8B
I’d feel bad
Sad
I want to help a variety of people young , old and in between!
I would feel bad and that I wasn’t being a very good Christian and I would have to ask Gods forgiveness,however I do donate to St.Judes hospital as often as I can 👏🙏✝️✝️✝️
I do donate to Feeding America of SouthWest Michigan…
Would make me happy to be able to help
depreseed
Great
Sad and useless
I would feel horrible if I failed to help someone in such great need
It would make me feel really bad you know I’ve been in the same kind of position you know nobody really reached to hand out for me and then they did. It was always like go for short time and you know I did the best I could and any money I cleaned the house. They weren’t appreciative of it. You know is that she’s a lot better dealing with the fucking bullshit you gotta deal with when people just become so forwardof work you like a slave
😢😭
i would be very upset at the cruelty that was shown to that young boy
I wouldn’t be able to sleep at night
Angry
Quiz is complete. The guilt trip is unnecessary. I voluntarily interacted with Charity Navigator. You don’t have to guilt me into giving to charity. This is overkill, and insulting. I’m done now.
very sad
I imagine he might tell me that he is willing to do whatever it takes to get him and is family back on their feet. His commitment and enthusiasm inspires me to work with him to make that happen.
If possible, I would give her some money to buy food for herself and her family . . .
I would feel awful and probably offer to adopt Lucy so that the lady wouldn’t worry. And then I would adopt Lucy or find her another good home.
It would suck.
Very sad
Lucky that I currently have a few tabs open re: how to establish a trust for your pets.
i would do what i could do !
Find it a loving home
I understand
Horrible
I have donated to Donor Choose a few times, and have always been happy with this. I like filling an actual need a teacher has, as I was a poorly paid teacher once, and had to pay for everything out of my own pockets.
Sad I would offer them a place to stay
Bad
Sad
Don’t know
Finished - please stop
That would make me feel blessed
God help them
To retrain that person for another job with benefits and pay them more money
Very,very,crappy.
Very concerned and would like to send them to the tight organization that can help them get a foothold to start a new.
Very happy a confident
Thank you Sir or Ma. For all you have done and given. I offer my Prayers for our Lord God bless to be now for you. Thank you so much morethan said
I would feel terrible about the animal going to a shelter
HURT n UNFAIR N GO NACK N HELP HER WITH CARRYING HER STUFF N BABIES N BRING HER HOME TO FEED HER N GIVE HER PLACE WARM TO SLEEP N LET THEM STAY UNTIL SHE THE MOTHER CAN GET BACK ON HER FEET N ID HELP HER
It would hurt me deeply
Sad
Don’t know what to say
O will still try. To help them read
I’m a cancer patient as I speak personally
Really bad
Sad 😭
I need a car to be able to get to any job I can get
Sorry, I’m not willing to get into emotions
Wonderful
Great amazing
I would be heartbroken
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX-JAIyX&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBYdt6deu7UrnpOqBSfCilvqKLzqhB37hCYTGhWBMCLUQ&oe=6585D7CB
Full of love and life
sad, disappointed
Joyful
Guilty
Thank you, I am a special teaacher.
Very bad
😭😭😭
Thanks for the info! I’m finished.
Sad
Upset
I’d feel lousy
What can’t I help this teacher out with a few boxes of markers?
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX_pmWxg&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCyjZsrp5PibX84AdwJs2iq6fkoEeI1ff8bO5ZDlPitLQ&oe=6585D7CB
Money donated to ASPCA goes to the people running it.
Pretty crappy
Ashamed
unsure
It makes me feel bad and they might tell me at least to get any means of transport for easy going to school and coming back home
I don’t want children because it’s bad for the environment.
She asks me to make sure to take Lucy into my care and give her all the love and affection that she has gave to her and make her apart of my family as she did.
Send
Horrible
Sad & Angry
I don’t think I do
This would make me sad for both of them
Frustrating
I would be heartbroken to leave the world without having done something
Oh, I will do my best to help them find shelter!
It would make me very happy
Distressed
Terribly
helpless and discouraged
It would make me feel upset because I couldn’t help him
Stop
I mean, I’d hope he would know that what he’s experiencing is a failure of our system not a failure of any one individual, let alone me. We need universal healthcare, not to blame random Internet people for not providing medical bills for hypothetical firemen.
Stop
I have no idea what they would say let alone how it would ““make me feel.”” But I’ll go to their website and check them out.
I would never do nothing
Terrible
It would make me feel awesome
I would feel terrible
Sad, wonder why she’s on the curb, am I capable to help her
Guilty
https://scontent.xx.fbcdn.net/v/t39.1997-6/14129667_1775284816045556_1588821643_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=gZAO6AR2s30AX_TzY9a&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDKeAa46PWP1j04y-GGdBtMkUcA-wyi5bxrnyWVYxXf2A&oe=658521BB
I would feel inadequate and like a failure
I would pray about it and talk to elders in church to see how we might or even food banks.
That depends on the sincerity of the person
bad

I will tell the old lady to let me take care of Lucy I will promise she is going to be well taken care of.

Lucy will have everything that she needs.
Depressed
Ashame about this
Awful
Helping her go to school might make her feel empowered. What can I do to help you feel safe to travel to school?
Not good
I’d say there were so many pressing problems, it was very hard to know what to focus on first or the most.
I would be more than a bit ashamed of my lethargy
I would try to find someone who would be able and willing to care for her dog
They needs to do something about this
Ask them what they love Todo talents and hobbies
I would feel bad.
Disgusted, terrible
Pretty sad
I’m that’s the same situation me and my husband are in now, kind of because I’m on sick leave and he’s only not getting any overtime, I guess we would have to either sale our house or borrow money from are mortgage bank
Awful
❤️ Broken
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX9DbMGN&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCxmdEMqJrTjnIMWwsH_j6i7L25TVFPU7zaoVmW4DSw7Q&oe=6585D7CB
try to rehome her and if that doesn’t work out go to a no kill animal shelter
Horrible
I worked with people with developmental disabilities before I retired. Enjoyed it.
Sorry but I would ask if I could help I wouldn’t reject people always need to hand in life
Very bad
Ashamed. We have more than enough
Sad
He approach me and ask me that she benefited nowhere to go I would ask her if she needed a place to go if I had one I would most definitely give her one and make sure she was safe for me I would never throw anybody here or turn them away
I first off would always help someone in need so I can’t fathom this question
Belinda
I made sure that my own children were afforded every opportunity available to them and I was involved as well so I feel like anyone who is willing to invest in themselves and have a good foundation, it is what I want for my kids of the world!!
Like I failed him
It would make me feel.bad for them and I would do all I could to encourage them to stay positive and kmow there was always hope that things will get better
I’m terrible at that
I would use all of my knowledge in that field to assist them to find housing and make sure they had something to eat.
I am already familiar with helping people in dire situations - I always help
although i can’t personally appeal a sentence, i would want to help in any way i can
Terrible
I’ve been through this experience twice with cancer in my life and my sister. I know the caregiving aspect
I already do this. I am a retired teacher and think we must take care of the earth in order for man to survive. Everything we need comes from the earth. Mining hurts the earth and takes quality of life away from the people and animals that need the producers to survive. Taking care of the earth provides for all of mankind and every animal species.
I would be embarrassed and ashamed.
Very bad I would do my best to preserve the land for the lions
Stop
Sad.
I would feel like that person got cheated .
Sad
Hurt
Kind of shitty
How they grow up an 🙏 everyone an everything
Wonderful
STOP
I give generously to Our LOCAL food bank because I know exactly how the money is used. It is totally run by volunteers so NO administration costs which I learned can be enormous and the “needy” are served honestly. There are charities that are “”bogus “ for lack of a better word.
Very bad.
I am confused by your choice… While I believe in rainforests these are not part of the continental US. Here I participate in Nature Conservancy, National Parks, Sierra Club, local land conservancy groups. I also am a big supporter of RedRover – the best animal group I have ever known…
It would make me happy to help people and children that need help , we all need help
Horrible
I would sit to talk with her to find out what kind of help her and her baby needs and get them some help
Well I love animals
I would try to tell them how important they are, how tragic their circumstances and listen
take quiz again
AWFUL
I would not be doing God work
sad
I will feel awful because humans are the ones being cruel to the animals
grateful
Sad
I were one point from been leukemia it is very important to me
Sad
bad
It will make me sad
I would listen and help out I will give it. My all.
Very sad
Guilty, ashamed
Concerned
I would not ““do nothing”” in this scenario.
That would make me feel downright awful
Like I did what suppose to do
I have a pet which is a dog an it makes me up set cos people leave or hurt there. Animals
Sad
Lousy
STOP
Confusing task
I don’t have grandchildren
This is not what I want
Man this is manipulative as hell. Not the turn I was expecting this to take at all.
Losing my mother she died she was 73 and I wanted her to be healthy I’m sure daughters charity Gallagher on her daughter of her but she’s the only one to take care of
I’d feel horrible
I would do my best for him,her and introduce the to a charity that help people in their citation
I dont
I already give to children in other countries
Sounds like a good choice
Id feed them
I adopted a 12 year old dog whose owner died. It breaks my heart to see animals abandoned or separated from their families. I support the LASPCA and Take Paws Rescue. I have 2 rescue dogs.
Feel sad
The point isn’t to move the animals, who will probably just return to the place they know. Besides, more animals than lions are endangered by this toad. I would tell them to build an animals only over- or underpass to allow the lions and other animals to cross the road without being endangered by the cars. They are very successful in the states, including Fla and the west.
It would make me feel Luke a failure
Grief
Not a understanding member of life
Imagine3what they might say
Goodbye
We’ll be sad to see you go. Let’s try one more time (that’s the last of it, we promise):
Quit
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX9fzCtl&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBihGZxzcKgRxdW2Uskcdhr6Ok4uyB2RHfpIvmPgOrw7w&oe=6589CC4B
It food stamps in checks from the state to help them out until he can get another job
Responsibility
sad
I think he would be in a better place
Rather guilty
They will say that they don’t have anything to save and this will really make me feel bad
hurt
Sad and angry
Sad
It will feel bad
You will make me feel very bad we couldn’t help him
I think they would understand that I was concerned but was able to do little individually but that it was now their responsibility to take over.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX8vDGL8&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD4kn37bDnFtQkwOOqXvzlZhy6av8UJX63GOx9EDJSWzA&oe=6587D20B
stop
Very Upset
Awful. I’d like to encourage people to provide for their pets after they pass on.
Good
Yes Thanks 🙏❤️
This is a weird, manipulative question.
thankyou
gotta go
I WILL HELP EVERYONE IF I CAN AMEN. THANK YOU HEAVENLY FATHER, THANK YOU JESUS. AMEN
Powerless
What is he hiding from me ???
I have experienced this. I wanted to find her a place to stay immediately.
i lost my mother to just that type of disease two years ago
I would help.
Sad
angry
Good
Stop
guilty
I would be extremely saddened by this. Dogs are family and I would do whatever it takes to find a loving home for Lucy. Even if it would mean to foster Lucy until I can find a home for her.
motivated
Responsible
good
I’d feel ashamed for not acting according to my values
It would make me feel terrible
Horrible
you’re not listening
I would help
It would make me feel like foundational change needs to be made to his school. Instead of stealing the best and brightest from the public system, resources need to be focused on shoring up the foundational problems in our public system. Not eroding it further so the least served w/ the least parental involvement get left farther and farther behind.
Ugh
I would feel moved to donate
Bye
So sad
Good I grew up with a brother afflicted with cerebral paulsy.
This hard sell was unnecessary
Have given books away when teaching years ago.
really bad
Like I was ACTUALLY DOING SOMETHING
Take her to get help feed and shter her 1 night
IDE. Be. Very. Happy. Cavncet. A. Big. Thing. In. My. Familey
I truly believe it’s in the GODHEAD hands, as Jesus the begotten Son of God Almighty and his Name and his BLOOD, and The HOLY GHOST our Comforter which is truth. As the triune God. The divine Healer of home is Jesus Christ, and Jehovah Roi The LORD my Shepherd or the Jehovah Rophi The LORD my Healer. The Anointed King of kings. O how HOLY is He.
Sorrowful, Imagining what if that was me I would like to know that this perfect strangers approach would be an opportunity to work find housing and means to meet my monthly obligations that this not an reoccurring effect of my life as a single parent myself raising 5 children on my on basically, if wasn’t for a nursing Assistant Nurse, job adequate transportation a strong church home and supportive family but most of all and the key ingredient knowing Christ Jesus as my personal savior.
Terrible
My grandpa said in New Mexico their is an apple with the seeds that cures cancer
Unsubscribe please
Not good
This shouldn’t be happening
I wouldn’t feel nothing
I would of took action and helped her. Their would have been no talking.
Well, if at the time I had the money, I wouldn’t do nothing. I would obviously do whatever I could in my power to help.
I would feel bad
sad
Very terrible no one should go through this it’s a terrible feeling and it is terrible to let the family down as a support man should do for their family
Horrible
Happy.
I don’t have children or grandchildren, but I’m focused on all children who will feel the brunt of the climate crisis
I’m in low income as well,I have worked on 2jobs still trying to make ends meet,it is always a struggle,we do the best we can
Well I’m really not sure but I don’t think I’d really be so proud of it
I would help
Sad and angry
Good
I’d be off to the bookstore for a book and then I’d explain what public libraries are for.
You tell me how i fit leftout
It would be awful
Sad
Bad
Bad
I would feel responsible for displacing the lions
Sad
I have nothing ..very rude comment!!!
I would like to make sure that you have a good job with your own business and you are a good person and I would like to see you and your family in the future 🙏 and thankful for your money and the best place for you to get in touch with you and your family is a great big understanding of the best place to call their mother and father to see if they are going to have a great time
I would feel terrible
Very sad. That is not me
It would make me want to be part of the solution!
I would feel terrible, but I would help immediately
Sad
Stop
Housing Matters is an excellent organization but I was looking for something that is more grassroots
horrible
Yes we
Upset
I would feel motivated to try to help.
Irresponsible
good
Sad
Stop
I have charities that I donate to. Some are for the support of our veterans who come home with the invisible wounds of war. Some are for the support of children and teens that have not had the best family life.
I would feel really bad that it’s poor man couldn’t get the help insurance that he would need at the time he needed it
Sad
Awful
Interested in learning more
I would have to try and help her.
Really SAD
I would encourage her to speak to someone at ASPCA and possibly discuss options for Lucy.
I wouldn’t Not do anything. I would try to help
Very bad
I would offer to adopt Lucy
Sad to tell them the truth
It would make me happy because I always wanted to cure children that are sick
NUMBER ONE I WOULD HELP THEM OR PUT THEM UP FOR ONE NITE AND IN THE MORNING I WOULD HELP HER FIND HELP.
Actually the planet’s biggest problem is overpopulation. Solve that ethically and everything else will fall into place.
Lower than life & embarrassed
Horrible, guilty.
Good. I. Like. That. It. Will. Be. A. 2. Way. Street
They are missing so much in left, not being able to read
I currently care for my elderly mum and am looking toward the future.
Terrible
I do not quite get your question
I already give to ASPCA
Stop
I am a special education reading teacher, I know where this sad fact is real
Terrible
That would be wonderful
Terribile
Is it public education
Tearme apart
I would feel good
Sad
Sad
Terrible
Helpless
Sad
Helpless
Helpless
I would take the dog and try and care for it
It would make me feel very like everyone deserve the right for help anyway shape form or fashion
Heartsick
I would know how she feels and what she going throw because it’s happen to me before so I would know what to say and do to try and help her
Wrong
Very important
I am finished with this “quiz”
I have been there, there is absolutely no way that I would be able to sit back and do nothing! I would be just as scared, lost, angry and frustrated as this young woman is, that I have to sit there and do nothing.
Shamed
I would feel very bad and in hindsight I might try to reach out or contact him to start over with learning whether and how I could help him.
G
Stop
I have been there.
Guilty
lousy
I want to what I can so you have a healthy planet to live on
It would make me feel like, this isn’t what God would want from me
Sad angry frustrated
Terrible
Helpless. Frustrated.
Selfish
Guilty
I meant to learn to read. Can I change my answer?
I would feel bad and do what I could to provide her with some food
Bad
Warm
I’ would go all out to prevent dog from shelter
That would break my heart
I’m 65 need a place to live
I don’t know just what to say right now
Excellent
Why can’t you help me?
Awful.
Nope
Not a good feeling.
Not good.
Your questions are going beyond the scope of the test and I’m done answering
I currently am actively involved with Kokomo Urban Outreach and I support them financially and actively with my time.
I already contribute monthly to Mercy for Animals, and I give more than I can afford to.
Sad for them and empty my pantry to feed them
Awful
Exit chat
““Was it too expensive to help? Could you have done anything??”” It would make me feel sad of course but it’s not wise to have a charity thing using guilt and shame to motivate folks to want to donate, just saying.
Look I’m sorry I can’t help I live with M.S. that is Multiple Scolosis I’m on s.s. and that’s not much so sorry I can’t help bye bye
since I have been in that situation. I would say, do it for the children
How I feel depends on what the imaginary person said
bad
I want to be the person who says, ““I’m so sorry that happened to you. Here, could you please fill out this contact information while I connect you with the person who will HELP YOU.””
I would donate.
Find the person responding for throwing brick through window and why; then go from there.
start new quiz
Bad
Your survey is way to limited and doesn’t work for me.
I would feel awful!
Badly
All right, I get it. Thanks.
lol
Special
Cancel. Not interested. No more messages please
Great!
Terrible
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX_6s8OQ&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDCtF9pgeJeWzoQJ6EU3FULF224d4I6w94c0v-QEjkV4w&oe=658BC68B
I know that my Grandfather always said that farming even with all the new ideas and equipment that it is a big gamble and never easy
Embarrassed and uneasy.
Like shit
Guilty as can be.
Awful that I can’t help
Rather helpless.
I would lesson to her and then try to help if I could try to give heR sum help know the lord jesus
Stop
Gratified
I could not just walk away not first know how I can help her
Fuck off
Restart quiz
I would feel terrible because I have been there. I can’t help with money but I know resources now.
Sad and guilty
I would want to take them to a safe place
Stop
I would feel horrible. However, I’m already a monthly donor to the ASPCA.
Stop
Thanks. That’s all
Regretful; determined to learn about current near extinct animals
Sad
Bad
I would offer to take her dog once she passes
Alot
Better
I would feel amazing, like I was fulfilling a purpose. I lost my grandfather and mother to Colon Cancer, and if I could help someone, no matter what cancer they may have, to have even a little more time with their loved ones, I would feel like my life has meaning.
I would ask them if they had any food and a place to stay
https://cdn.fbsbx.com/v/t59.3654-21/411867483_915559153421652_7432739312506052260_n.mp4/audioclip-1703308368000-146837.mp4?_nc_cat=105&ccb=1-7&_nc_sid=d61c36&_nc_ohc=7bvC1FJ4Dz8AX9FJNqX&_nc_ht=cdn.fbsbx.com&oh=03_AdRp5MjFocpf5-JX4uhFcf_mzK3nw_cMqQGAYXElPgRv1w&oe=65884E5E
No 👎
I’d rather help animals. Needy shelters.
So what
Extremely frustrated
It would frightened me
Make them get back on their feet
But I’d like to help
Helpless as I don’t have much money to donate.
Awful
Distraught
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-M0mtV&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDu9uG-evrWMB_NMCebtafeWnvM2O7V0rncr7CXHaOMKA&oe=658BC68B
Happy
Unsubscribe
If there is a person that needs food I try to help or tell them where there are food pantries or churches that give out food!
I would feel terrible.
I would be sad because he is struggling and feels lonely and afraid.
Sad
I’d say senior; you must now plant your feet in the ground 🪴 grow some strong roots to other cities and look for work
I would be distressed.
Terrible
Need to help
It has and would make me sad I have been on both sides and been the girl looking for something to feed my baby and no help so I have alot of empathy for young mothers or hungry and homelessness
Sad
Like a terrible person
I would be upset with myself because I didn’t do my best to help
Guilty.
See that’s the thing,. I would help. But if I was them I would say,. Get lost. Get away Frome here. Go home
Mad at myself for not helping
i would feel embarrassed and sad knowing that i’m allowing these things to happen to an animal with feelings. they can’t speak for themselves, and it’s not right to continue supporting companies and practices that continue this cycle of abuse. drinking milk, eating meat, and consuming animal products aren’t necessarily bad, but fighting for the companies who give their animals dignity and respect is important.
I would definitely change my answers about not doing anything to help with the rare disease.
I wish I had books to read
Ok that makes me feel great
Old news I’m legally blind freedom from terrorism inflicted upon me by 2 sisters :(
Wanting to fight for them
I would want to help.
Concerned
Really good
Upset
Sad
I need to help you
I’m going to feel bad
I will help her
I would feel sad and guilty
I would feel so bad
I would not do NOTHING
Upset
Terrible
They’d say I am ready and able to be productive andcsupport my family
So there fellow may I ask you bin there so have you any advice or thought for my direction
Having been a social worker and a therapist I know what I would say or not say
I don’t know.
I am concerned about older pets and their quality of life when their owners are ill or die
Horrible
I’d feel horrible
I arrange for someone to tc of the pet before I pass
If a child who couldn’t read and didn’t have a single book and I was nearby enough for him/her to say something to me. What that child should say is: ““Why?”“.
Worried, upset and want to help any way I can.
Awful
take quiz again
Bye bye
Thank you, I’m going to begin donating to this charity.
There is no location near me which I believe would be an necessary question to make a charity match decision.
ashamed
There is no way I would respond without helping!
🛑
That they reached out and asked me if I knew of any resources in the area?
terrible
Very sad
Exasperated, disrespected, dismissed
I would feel sad
You need to put your money where your mouth is. And where you’re pretending your heart is or you’re not really sincere.
Sad
Look for another job
Not interested
I do give as I can. I don’t think my grandchildren will be upset with me.
Guilty
It would make me feel greatly disappointed for her. But, I would suggest that she still fight and never give up. No matter how grim/bad the news is. There is always hope.;
Glad and grateful
Because ASPC endorse the animal shelter at Charleston, WV. That place is a disease pit for dogs and cats, they don’t disinfect enough. They make it look pretty but it stinks awful. The conditions inside their nursery would appall a World War I doctor. Evidently, they were stealing the disinfectant wipes and spray I was sending them for personal use. The Fixem Clinic is a discount animal animal hospital in Charleston, WV. I donate monthly to. They saved my buddy Theresa
Oh please 🤬
very sad
Pissed off
Terrible, like someone needs to do something. I would go into action with raising money
That is a fine option for a charity. However, I don’t need to a local animal care charity. That is completely volunteer run and all funds go to the animals directly. So there are no ceos to pay or employees to pay.
No response
I would feel sad and scared for them
I do not wish to answer.
I’m going to give to them. Thanks.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX_R81xh&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA9BCKzWR5SS834fnatNMa7TcK27yWRIAMYp7WAZ-wk2g&oe=658BC68B
An excellent opportunity
The child and parents are being tossed aside.
They might say I didn’t really care. That would make me feel terrible.
Terrible
InterFaithWorks
I don’t understand the wording of the question. I would recommend the young man find a different place with the sport or try a different activity. I would discuss the coach with the principal and advocate for a second team because even if that coach was reprimanded, he’s likely to punish the young man in some way.
who is they?
Awful
I would feel so bad and say how sorry I am that I was not more considerate
I think the federal government audit give more to the schools and teachers so that they can help the children with more room and more teachers they will be able to help the children it will give the children more learning because my answers in my questions don’t come out to a roll of beans but the federal government has the money and the ability to do this
Saddened and determined to find a fitting response
I would help all I could
Regretful..
Not really impressed
Angry
Depressed
Terrible
Will sorry I don’t like here I was put out to I
Crappy
Ok how would I be able to help him
You were doing great right up until now. I’m looking for facts, not emotional manipulation. I’ll look into the charity but I’m done with this chat.
Sad
Bad
Wouldn’t like that
concerned
I have a child with a ultra rare genetic disease that was just found within the last 6 years. I would support genetic research and families affected. I think this is a false dichotomy. My giving is going to be for rare genetic diseases.
I already support the ASPCA.
I would take the animal home
I have no clue
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX9s4pOl&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAhLFH4NMQtbvcYHbPD9hiZiTMyd-5koTkFWCixD2mDgA&oe=658BC68B
Can’t you help us
I would feel better from Steven
Frustrated
Horrible
I probably won’t have grandchildren because of climate change, though if I did, I would share with them what we tried to do.
I would feel gut-punched
Dude idk I just want to know about the charity
Great
Useless
Not great!
How was I to be able to stop it I’ve never been there or out of the us
Like the worst person in the world
They would do what the kids need
I would do what I can to help this student find different avenues to help assist with the cost of a diploma. Underprivileged students have more options than the middle class students.
Terrible
Dad
incompetemt
Bad
I don’t have to imagine. Imagine a young Jewish boy of 13 at sleep away camp in the South waking to a burning cross. SPLC is the perfect charity recommendation.
ashamed, embarrassed, guilty complicit with government
Ashamed that I did nothing for the elephants. I have contributed hundreds of volunteer hours to local wildlife rescue. But I could do more.
I would try to understand and try and give him some resources and advice.
I would feel guilty that I have so much and she has so little.
I would feel very good to know that she has over come her sickness and thank God because if if was not foe him it would not be possible
I would find good home fore her dog and,that would be the right thing to do
?
Sad
Feels great
I am very active with the largest faith based food pantry in my area so this isn’t something I would do! I do not turn people who are in need and hungry away
Heartbroken
Very sad
Teerible
I would feel compassion and want to help.
Stop
Feeling very sorry for no food
I struggle to relate to our country’s athletic preoccupation, but I do feel there needs to be more places of acceptance
I’ve been that person. It’s traumatic
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX89Cz1w&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBNb5qxS8wODVkr0ThIJ9HKCC9XKOMpR3HCakciMtHyOQ&oe=658DC0CB
It’s so sad
Would feel sad
I would find a new home
Very sad
I never give up i if told them to try out and thry turned him down then the next message forwould have to be we troed ate we going to sit here do nothing? Np. Look other avenues yo find sippoû
They might ask me to take care of her. I would then be able to say yes or no or ask around to find a safe forever home among my friends.
I would never do nothing.
Sad
Happy
I wouldnt want them to feel they didnt deserve to be included in society, it alienates people with disabilities when these sports aren’t inclusive
I would try to find some good places for them
I will try to borrow money to feed them
It would break my heart because I’m in the same situation as the old lady.
The question doesn’t make sense.
Make me sad. I prefer a charity that allows hands on work not just giving a check
I have a fear of not having enough food for the family. I generally buy extra & give it to others & churches.
Guilty, although I am not the one destroying them.
Sad
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX_BaIUb&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBh5Ghq7-H-xm3q06SAskfkLqDj7YJYWLkUI_DZ1oMbOA&oe=658DC0CB
It would make me feel good. This is a charity I have donated to before. I have also donated to food banks that, I believe are affiliate with this charity.
Stop
Not good
Concerned
Awful-stupid-selfish
I would be very sad and quite empathetic for him, and would try to help him and provide moral support.
how would I even know him
Children and food
I would feel useless!
I know the feeling
Useless
I would feel as though this child was living in a home that was the result of several bc generations of children who had beef left behind. Good possibility his parents couldn’t read Hiss/her teachers had just push him/her through without seeing to it that he/she had not been given the proper help to over come the ability to read. The education system, I.e. , many teachers and education boards do not look at students who don’t automatically Excell as a drag on their time and money. I am speaking from firsthand experience. After I retired I volunteered 7 years as a para pro in our systems middle school. I was appalled at what 7th and 8th graders cou li don’t do. My first year I was in math classes. I had 5 students who couldn’t multiply beyond 3. The following year I was in a Soc
Stop
choose charity purpose
This sounds perfect for me. Thank you
I can’t imagine that. My school age children and I were once homeless and penniless. Been there done that. Know the shame and desolation felt and the embarrassment to my sons among their peers and mine. Only a few were compassionate not even the family that took me in as a child of an unstable, umwed young mother in the 40’s.
Sad
Too bad the US was your only option
I never had any kids or grandkids to add to the pollution and destruction of the planet.
I’m not sure
I would feel shame and sick to my stomach.
Like my actions made a positive impact on someone. That would make me feel good
That would make me feel bad
(You misspelled “teem.”) I don’t believe in guilt-based giving.
Terrible
😭
Just want to know I I have a friend
I would feel awful
Are you going to help or just watch?
Terrible
Sorry I prefer do other charity
I would talk to them and try to provide help
heartbroken
Sad
STOP
bye
Everyone should be covered and
uncomfortable
I already care for folks in need as a pastor. I have cared for many people over my career.
Like I should have done more
Please quit commenting to me
sad
https://cdn.fbsbx.com/v/t59.3654-21/413902939_327605870167052_3973075981097173863_n.mp4/audioclip-1703463735000-2392.mp4?_nc_cat=101&ccb=1-7&_nc_sid=d61c36&_nc_ohc=Y_IytStn3cgAX-tFdxM&_nc_ht=cdn.fbsbx.com&oh=03_AdSuIOy3Xbu32bcsLdg1-iUCFs4H4L1VNUaDcS5vXleIBQ&oe=658A5F96
This great. I have a few blood disorders that would benefit from this.
Heartbroken
Hello how are you
Already have too many
not sure I understand the question.
Disappointed
I’d feel awful
I would feel horrible
Irresponsible
We have cancer in our family. Leukemia
I would be sad, because that may happen to my cats and dog, sooner than later.
Very sad
Horrible
I would be buying books to help with his/her reading.
My home
Horrible
Anvry
I would feel hopeless
guilty
I am that mom
I would help her.
Helpless
I am not sure, I am a 71 year old retired registered nurse. I had COVID and I still have brain fog after about 2 and a half years
Embarrassed and saddened
No idea what they’d say to me
I have interest in another direction that deals with dogs in need
Guilty
Horrible, like I’m betraying Lucy
It would make me feel really happy
Sad
It would make me mad if a coach told them that and I would comfort the Down’s syndrome.
I have been where you are.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8CC1CY&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDeAUHlnsGMI70gaZkwo-58ZNO1DpS3f4_y61mlAK4f0Q&oe=658DC0CB
That’s manipulation and below you, Charity Navigator.
I would do something to help right away, it is a crisis for that family, that moment .
Disappointed in myself
Devastated
I would have to do somthing.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX95oGcn&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA1-AOtt8Kzoi9XG5Aey7ipoxvpFsWtXxaBVVoAdX9FBA&oe=658DC0CB
Stop
If the child told me that they did not have any books, and either could not read at all, or could not read very well, it would not make me feel great at all.
Can barely feed me
To not be cruel to animals
Awful
Good
I am full of sound and fury, but it really signifies nothing unless I stand up and support them in any way I can.
Irresponsible
I have been trying to help the environment in small ways, as my I come is limited.
That doesn’t mean I can’t tell others about the importance of keeping our beautiful planet clean for humans and animals.
Fulfilled
Sad
Stop
I can’t imagine
Lucy would come to live with me.
Imagine what they might say to me..
I’ve laid off and have no training for anything else.
Wonderful
Hate the killing for profit!!
More interested in birds
Well I have never thought about this. But I do agree they match my goals. Have to think and study up on this. Thanks.
Compassion. Empathy. And hope for his future. And some suggestions
Hopeless
Z
Sad
I’d feel very sorry for the woman and her situation
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-HAcJ7&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAxXGO29vBGowV-bPNFa5GZh2Y4jrQiDZp7U0uRELf6KQ&oe=658DC0CB
To the best of my ability
Stop
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-fVspc&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDaT_QdMDC_IkVx1Noi5zxo1ZC2u6dXp5k4e7YUZCDWxw&oe=658DC0CB
Helpless
Yiu are not reading my texts.
Got the answer I was looking for. Now I’m checking out the recommended charity. Don’t need any more questions
Help it isgoing to rain tonight. Thishappened..after l wenttoa nite meeting. Was raining. I drove by…didnothing. about 30vyears ago.
NOT AT ALL. PLEASE REMOVE ME FROM YOUR CONTACT LIST.
Like helping is the right thing
More interested in charity for autoimmune illnesses.
I’d feel sad.
Saf
ashamed
Awful
Warm and useful
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_lqhiM&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD4jFOvYjQKk0LLPHgev6rpUOh5l1vgMydR6BzKBml5pw&oe=658DC0CB
I will do anything in my power to help
Well if I felt respondance able, I would not say anything.I don’t though I help all I can. Now what good is that,if a balance between everything including people.I need help
Making an impact on an individual
Sad
They do not understand how dire the present situation is
Feeding America and my local food bank are two of my charities already, so good match for me.
Satisfied and useful
Upset
I would feel like that’s a strange interaction.
I would do anything in my power to help clean the ocean up around the world because one of the ocean stops everything goes wrong
Offer encouragement and try to find resources.
Guilty
Awful, I would probably find them a place to stay, and if couldn’t I would take them home with me!
sad, embarrassed and angry.
Sad but hopefully we be ok God take care of use
She is an environmentalist at heart, I am proud to say, but has little resources like me.
☹️🙁
Sad
I’d feel very sympathetic to their plight
Very sad.
Very sad…but want to help more than elephants.
Well I hope someone would help him
Well, Apparenlty HIAS doesn’t help people to cross the border. I looked. They help people already in refugee camps. So I wouldn’t suggest they contact HIAS. Plus–I checked–does HIAS also support Palestinian refugees–e.g. those stuck in the occupied territories of Israel? I don’t see that on their website, if so….
CANCEL
no response given
Ummm, not me. I know the community food banks and programs
Find out a little more about her and how she came to be in the situation she’s in and work from their making sure that her and her child have plenty to eat and are well taken care of!
I would feel horrible.
Sad
I will feel bad and look for a possible solution available.
Weall, I wouldn’t walk away, theres the salvation army and local places. we live in small town
Child - this makes me sad. Me - it makes me sad too. Let’s see if we can help save the ocean.
Helpless
There is no chapter of this charity in my area.
stop
No
thank you Stop chat
Go to the chatity
I’m not sure
I’m done. Please stop.
Overwhelmed
feel not well
I prefer to contribute to local charities. That being said, ASPCA sends unending spam.
Shderot
Sorrowful
Like I should have done something, even something small.
Horrible
I feel like I’m teaching an AI bot how to be more emotionally manipulative and that’s not great.
We need to fix this
End
crappy
Not good. She would need to share her need with me
I would not be able to sleep.
I failed when I could have helped
Really up set
Sad.
I would make a promise to find a loving home for Lucy
I would get food for them
Bad
https://l.facebook.com/l.php?u=https%3A%2F%2Ftemu.com%2Fs%2FKJjZ7xczdg5af56&h=AT0kdqeG88brRI7NjvuFHaKFdDCHjDFkz_KuzIIZ16n4-LwZsWslCXYxOxwavJyMdd15aDXreE2t4WSyzjOVBhBNBjjyCw_-eQJRBwRC42s4JDmOqCPYncS62qH7ahgclx_Kk527rU4&s=1
Anyone with even a hint of compassion would feel terrible
I’m am in the same situation
Hope Lucy finds a goog loving home
Angry

I have a bunch of ACTUALLY rare diseases myself - as in, less than 10k people worldwide with my disease. Have YOU done anything to fund research for ME?

(Side note, I don’t like being guilted into donating to a charity. I know this is partly for psychological research, so please note that MOST people will not like being made to feel guilty - most people get defensive, even if it’s in regards to something they would have otherwise agreed with)
I volunteer at spca…
There are no special Olympics chapters in my region
I would say it’s about time our schools put real education too practice instead of how much administatirs make. Having. Teachers in my family I see how much they spend on the kids in their schools and checked what the administration earns per year. Maybe they need salary cuts to what teachers make and then our children’s needs will be met!
Happy
Not going to
Sorry, your program is too limited.
Ashamed
I AM an old lady who worries about her pets, silly you.
ASPCA can help finding a home
I would feel empathy, and great sadness for him. I’d want him to know that out there in the world are more people like us, and we can be loved and accepted.
U are wicked It will make me feel bad
I would not ““do nothing”” .. I would talk to her, get her story and ask some questions.
sad
Sad
Actually, 2 years ago, I started making (money) donations to pet-food banks in the cities where my brothers, son, & niece live, as their Christmas gifts!
Stop
Start over
O
Helpless and inadequate
I would feel ashamed
I would feel like I am the most selfish person in the world.
Sad
Sad
I’d feel terrible
I would feel sympathy, worried, concerning, upset and trying to figure out a solution
Ok, I’m getting tired. Thanks.
Not good
Go back
Awful
There is always a place for everyone. Everyone has a community they can be a part of.
I’d want to buy the markers myself.
I would feel bad.
Horrible ,empathetic , and eager to help
I’d be embarrassed
Standing up for the weak and handy caped and children have always been a priority on my list
I don’t know
I don’t know
Grandchild?
Like shit probably
Frustrated
Stop
I would respond to the situation by asking her to write a grocery list of the most needed items. Then I would ask her if she wanted me to get groceries for hr or if she wanted to go shop with me. I would explain about SNAP benefits and help her sign up for them. I would also invite her to register at a local help center. But immediate food is the first priority.
I answered your questions, probably not the way you wanted to hear them answered. I will donate locally. And I quit answering yours after I explained that the CEO of the company you suggested receives over a million dollars in salary every year. My money does not go to places like that.
If I have a good thing which can help her i can give to her
Argh
Guilty and sad
tell hime that u need find good place and good money budget for own living with family and good wise budget
good
That it’s an opportunity to connect them with help
Tell me how to help
Stop
Well, I already support multiple environmental charities and my grandkids know it so ok in that score!
I’d like to tell her where to get free birth control. I don’t have any children because I’m physically disabled. I realized that I’m going to be very, very poor for the entirety of my life so I sought free birth control. I don’t have any children that I cannot afford to feed. The most important thing I could do for a woman who had children that she cannot afford to feed i to help her if she chooses to not have any more children that she cannot afford to feed.
m
Sad. Wrong.
O
I would want to know I did my best
Sad that they don’t know the joy of reading
Grateful to be able to help.
I give to Heifer International.
,
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_vAwqd&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAp_5AZa7q0lGCr_OS-kfyeYl4OZdl78worDUPmwiPoug&oe=658FBB0B
sounds like there are dummer people than me
?
sick
I would mentor that mother. I’d teach her where to get help, how to shop healthy for her circumstances, how to prepare meals using healthy ingredients.
Disgusted
Decline to answer
Awful
What are you interested in and perhaps we can help with education to get you employed in a better paying job to provide for yourself and family.
sad
Helpful
““I’m terrified, I can’t protect my little ones, we have nowhere safe to be… Or to go, we have lost everything””
I would feel terrible and want to feed them right away.
I would feel pretty awful. Thank you for your assessment. I think I will continue to support Week of Compassion and Church World Service instead of HIAS.
I don’t have grandchildren, but theoretically I would feel like a traitor or hypocrite
good
I have have access to books all my life. I can’t imagine not having any books available as a child. I would ask the child what they want to know more about and then offer to get them a book that is best for their age.🙂
Angry
indifferent
STOP
Sad
I am wanting to help women abused by their partners escape from the abuse.
Not guilty
Sad and guilty
Awful
Awful
Awful
I imagine I’d feel the same way that I feel about the crushed turtle
STOP
It would make me very sad and ashamed
Its not easy to help everyone but you have to start one at a time
for a chat bot you aren’t very interactive.
You are manipulating me. You just lost your credibility and ethics.
Bad
ashamed, but helpless
Why do we have ““ill-equipped”” teachers?
So regretful and selfish
Good
Stop these messages. I don’t want to participate anymore
I wanT NO KILL
Sad for her and her child
Bad
Terrible—it is a fear I have.
I’m looking for a different charity
Terrible
STOP
Stop
Sad
It would make me feel sad and compassionate. I would want to help but not know how
I’d like to help local dog rescues. Easier to see how you can make a difference
Ask specifically how someone is making their animal happy.
Like I had walked away and ignored the opportunity.
STOP 🛑
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-1Pi7N&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDt7oyo92GoclxJT47C2qNUPv_vtSEBJNstgxh5nxaDAA&oe=658FBB0B
Useless
I don’t know
Thanks for writing the book reading it with me.
terrible
Terrible.
A single student? Guilty, but I don’t have much leverage to change their life.
Awful if I am in a position to do something and fail to do it.
Sad
bad
Terrible
Bad
At first I would be angry and then I would remember everyone has their own opinion.
It would make me feel awful
Everyone is entitled to fresh water.
Awful
responsible
I don’t know
stop
The mother might say, ““It’s for my baby!”” And I would feel self-loathing.
Frustrated and helpless
Sad
I would feel awful if there was nothing I could do and nothing I could offer this man
It would make me feel like I wanted to help her daughter have the opportunities my daughters have had.
Sad
I don’t know if I would engage her if I didn’t have answers to questions she might have.
whatever
No thank you
Terrible
I prefer not to play ““how would this make you feel”” games. Didn’t realize I was opting in for a visit to my therapist
selfish and short-sighted
Helpless, and angry
Very sad
I’d feel sad for him and want to help.
I need another charity. I need to retake quiz
Like crap.
sad, guilty
I’d show her Danica McKellar’s work.
Stop
I cannot imagine a child without books.
Hopeful
thanks for the recommendation, yes it does align with my values
Sad and angry and frustrated
Am I supposed to write what I think the person would say?
sad
Good, helpful
Anxious to help
No
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9wSlgl&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCnVXEURVIh8zLY1m05mPtUr8YMu4gQtNilnUUNfhqjVA&oe=658FBB0B
Powerless and very sad.
There’s no need to guilt me into giving to charity. I was the one who sought you out. I will give to them if I choose, probably by going to their website and not through a middleman
Fuck all the way off.
Sad
Sad because she can’t provide food for kids. Or herself
I would feel good, glad that I could help someone. And possibly even more people in the future
Thanks! This is enough
Sad, angry, and wanting to help and to encourage her to be as safe as possible, but not to give up!
Guilty. Sad.
Do they operate in my local area?
I would love to help this elderly woman, unfortunately I can’t afford to donate at this time
I’d find justice for her
I would feel awful
Thus is useless and tedious
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX93WSnU&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAvoDROJFfXDdB1wAXqpIcFou3BZ32l-DyvkjEN3UZNrA&oe=658FBB0B
No
Desperate to help
Terrible
Hopeless
Been there had to relocate for employment. 1973
Good
Horrible
Sounds tragic
Terrible and guilty
Like that young man wasn’t given a chance to do their best.
Excellent
It would make me feel sad and guilty, which is why I am deliberate about contributing to causes I believe in, both foreign and domestic.
I wouldn’t let that happen
I’m more concerned for the souls of these people.
Sorry, this is set up awkwardly and I choose to not continue.
I have encouraged all of my kids & grandkids to read. I contribute to 1st book which helps place books also
Bad
What?

I don’t imagine what they would say; I realize it’s my human responsibility to help others.

I do think the survey is partial. I don’t think people generally decide if they should contribute to national or international programs but rather the donation is often in response to a specific disaster or unfair social norms.
It would make me feel aweful
Ashamed and complicit
It would depend on why I couldn’t (not wouldn’t), but I’d feel uneasy.
Like doing something
Guilty
It would make me wonder why I did nothing to help
Ashamed and guilty
Angry
Thank you for your service. How can we help youright now?
I have no children
?
Awful
Horrible
Not interested in charter schools
Want to be present with them. What can I do to help you? I will also be praying for you and your family. I want. To do more than pray.
I would do something to help if it was just to get a list of what she felt she needed first, then go buy the groceries for her.
it’ll make me so sad.
Stop
badly
Sad
I would feel terrible if unable to help
Horrible
Done.
Horrible
Good
Stop
I would be sad and frustrated at their loss of opportunity
It would be nice to be fully prepared on what to do
Not good
again
I’m too busy. I have other responsibilities. I must save for our daughter’s transplant. (I already give to HIAS)
So happy
Very sad
Like I forgot where I came from
Gratified
Thank you. I do give monthly to SPLC
Stop
The mother may ask if I could direct her to a shelter or church. I would do my best to help her with advice or meager money if it could help.
I would learn more from the liabery
Stop
I would do my best to help them
I would tell him that cows mk is for caives
Very hurt and compassionate for Lucy. I would want to take her in, if only temporarily.
Terrible
Ashamed
I will
STOP
Cancel
awful
Angry and scared for her safety

This assumes I would do nothing after talking to the child, and this is trying to motivate through guilt. I don’t do that kind of guilt and I am highly motivated by facts and logic — not manipulation through feelings.

If I knew this were the child’s situation, I would do what I could, but I know that a 1:1 response is not logical or sustainable. I would work to connect the child and family with an organization that would provide long-term support, then support that organization.
Thank you
Please note that not everyone plans to have a child or a grandchild. If anything, I just don’t want the amazing creatures to go extinct. This planet is too precious to be destroyed by humans.
For starters I would tell her to do what II-anti racism-anti-patriarchy folks do—join Black Lives Matter, read Caste, the Cross and the Lynching Tree, New Jim Crow, take road trip on Civil Rights trail, , insist on Critical Race Theory bing immersed into educational curriculum, support her local community organizations such as United Community Centers in east NY.
I live this. I teach at an ACTUAL public school
Thanks. Finished.
Hopeless
Fight to find insurance or free care.
Helpless
Sad!
Hopeful
I would help find them shelter cause I know housing matters wont
Inadequate
Eager to go elsewhere, as I cannot solve their problems
Good
I feel I’ve let them down, and should try harder to find the solution for this problem.
terrible
That would be so sad.
Exactly what I wish to avoid
Guilty
Heart broken and helpless
I don’t know
Thank you I am finished
Not good but motivated to clean up.
I answered. You don’t seem to have received it or this is automated and I disclosed much about myself you will never see. One more and last time: I am. Very very very old! Late 80s. Sparse income. Big debt. I can’t donate to any cause and there are many good ones. I help first graders at one school to grow their reading skills. Based on Maslow’s Hierarchy of needs, nutrition is number one. That’s physical survival. People who are educated can and should and often do respond to that need. Always there is poverty. A path out of poverty is education. This is simplistic. There is sickness and deformity and all manner of other hurdles. Education can work to relieve these. Education is basic to financial security. That is why I chose it. This is my second and last time responding. If I ge
I need to educate what all the factory animals go though
Very sad
Angry.
Sad
Can I make another choice?
Sad
That sounds like a worthy cause
I would feel like I had to help them immediately
Girls a lot of what men say isn’t true it’s what their egos like to believe. They say things like girls can’t do this and girls shouldn’t do that but in fact we can and we do. I’m an architect I should know. My field is male dominated, but women thrive in it, and ALL STEM fields. We live in a modern world today. A modern world where girls and women can do whatever they set their minds to. Courage and the will to succeed are all you need.
““teem”” with life not ““team””
Stop
Heavy on the emotional manipulation aren’t you?
Feel hopeless and anger towards our systems that puts people in these situations
That is exactly why I support Samaritan’s Purse - they meet those needs and also provide hope thru the gospel of Jesus Christ.
Really good because I could answer them
I would feel sad
Stop
Thanks, not interested in the question.
I am an action problem solver and also safety conscious and I could NEVER WALK AWAY NO MATTER IF ALONE OR HOW I MAY ASSIST! OH I BELIEVE THUS IS A GREAT MSG YOU HAVE INSPIRED with in today! And fact I have no ties in this usa and blessed to have avmbility to go where want….thank you! How nay I jump into physical ha ds on acrion?
Conservation requires money, legislation, leg work & skilled media staffing - other than telling others about Rainforest trust ( Which is not heard of till this survey) giving $ is the best we can do
I have a dog named Lucy whose future with a trustworthy friend is already a legal document.
Optimistic but ready to take action
They might ask why I wouldn’t help. I would feel guilty and powerless
Don’t like the question.
Ok
Terrible
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8SsGBm&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCigaBMNUhGexonZ5-ej7JjhEWGtj-yyqQebnuBaaa36g&oe=6591B54B
STOP
bad
Horrible !
Sorry, currently homeless myself right now. Since May. The salvation army work help her, or social services
Sad
Don’t have an answer
I already give to them!
Ok, thanks, that doesn’t answer my remark at all
I love it
I’m not needing recognition
ineffective
I would feel terrible
That there are people who don’t judge
Thanks, I got the recommendation
I would want to try and do ANYTHING I could to help get him and his children to safety.
I failed
I would have to help them. I couldn’t leave them.
Horrible
Terrible
It would make me feel like I was not upholding my values or moral philosophy, engendering guilt and diminishing my hope for a better future.
How do I opt out of this conversation?
Horrible.
Horrible
I know first hand about a school that was like this. The one my children went to out in rural Missouri. My son had a 138 IQ but they didn’t have time to teach him at his level. Most of the children could barely make a C grade. The parents and school system just figured the kids were dumb. My oldest daughter graduated and was accepted at a private university but my other daughter and son were so bored they quit before graduating and got their GEDs. More people moved out here from St. Louis and were unhappy with the school district. The school board brought in better teachers and administrators. changed the teaching and projects and totally turned the school around. Now it is a great school and more positive environment for the students. My oldest grandson graduated 2 yrs. ago from th
Tldr
Great
Amazing
Sad and a bit angry
Not a valid question as I have no children and at almost 60 do not plan to start now
Sad
Sad
I’m sorry. This does not sound like what I am interested in
No, probably it does not. Almost all dairy cows and their babies live bad lives. BUT. You don’t have to drink milk that comes from cows! There are many milks that taste just as good and come from plants!
Stop
i cannot imagine a scenario where i wouldn’t help at all.
Not great
I would feel terrible
STOP
Devastated
Sad
Well I don’t have kids but I imagine if I did nothing I m a heartless bastard anyway
Like there should be something to help.
I would feel terrible
Good
They are probably hurt aņd angry already, the person might get angry at me, and it would make me feel lower than dirt
I would be well pleased to know I helped someone out
Horrible
It would make me feel that I need to help in any way I am able.
I’d feel useless
Please help us!
Good
First of all, I would probably empty some of my pantry for her. I might possibly take her grocery shopping or buy groceries for her anonymous.
Helpless
I want to retake quiz
Stop
😞
Sad and determined to prove the coach wrong.
Horrid. Then I would try to find someone like a TSA or Air Marshall – an aurthority (sp) to help
Stop
I’m already giving to ASPCA
I would feel bad because his chances of achieving this would appear to be low.
Terrible
Guilty
Delete
good
I would be sad. If someone treated her like that.
No thanks.
I’m done with this quiz
Heart broken for him
This person matters and their need is important so they can continue to pay it forward for a better world.
Motivated to change their situation
Would not make me feel better. Though I can’t fix the problems that caused them to flee. I can help, one person at a time
Ashamed
Good
Teem not team. Maybe the education one would be better.
Thankful
Horrible
Sad
Guilty
Stop
Shitty
Disappointed
disgusted and frustrating
Hello?? I don’t feel comfortable
Buddy I talk to my aliens all the time we got it going on
Which charity?
Bye
What is the charity
What am I imagining You left something out
?
Who are you talking about
Great
Information in question format incomplete
confused
How would this make me feel?
???
Don’t understand!
Who, I did not get a charity name
I am about to tell you to go fuck yourself
It has NOT given me the name of a charity! Great quiz.
talking to who?
I’m still waiting on the name of the charity. Please tell me the name of the charity.
I don’t understand what you are asking
I will be so happy when every cat and dog are safe warm and healthy, Given homes with loving families who realize they are part of a loving family!
I don’t know, because there was no charity or person given
I didn’t receive a charity recommendation. Just an exclamation mark.
Your Chatbot does not work. This makes no sense. Logging out.
Who?
Not to blame
She would say the Lord truly blessed you
STOP
I understand cancer and it’s needs
Exit
Terrible
I would feel badly because I was not able to help him out of a poor situation.
I wouldn’t do this
I would feel bad for them and try to talk with them and encourage them
I would hope I would/ could find a way to help her get away from the man
Not good
Awful
Government can help but teaching them not to rely on government all the time. They become lazy and un appreciated
Guilty, ashamed
Not sure
Sad
no grandchildren here
Cold
?
I would buy them some food an tell them if they need help
Sad
I would feel terrible.
Thought this was a non-emotional study. Are you purposely mixing variables? Is the next question how much I’ll contribute?
Stop
Sad
Got it. I will give this a lot of thought
Horrible and responsible
I know the Trevor Project. I had hoped you would tell me about something better
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8f4QNu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCOXyMwGSEpU-ye34cSRVUh2iQUt3FWpnC7_HiZbBp5sA&oe=6593AF8B
stop
Alresdy something I think abvout. My annually donating to NRDS is about the future for others, not for me.
I already donate to this organization, thank you.
Sad
Sad
Happy
Crappy
shameful
Terrible. That’s why I already support Feeding America!
L
Important, like I made a difference
Good bye
Terrible
Pretty good
Offer to buy a few neccessary items
Like helping
Sorry
Sad
Sad
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8iehYU&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBggme_Mvj8ALR3Xl4zcvXoBpLqhk0csvd2ZOY2OwzoMA&oe=6593AF8B
It would break my heart that they had no access to books. Worse would be if they didn’t realize what a loss it would be.
I would support local individuals in need but this result does not fit my overall contributions. You should allow multiple answers to what causes interest me.
I’d be ashamed
It a very hard job
good
Sad
Stop
Can I start the quiz over?
Insignificant, unseen
like a failure!
If you can help, please do.
Sad
I have a tesn
They would say we need more money for classroom expenditures
I would feel awful and I should note that I have given monthly to SPLC for 25 years
Sad and angry
I would feel horrible
Someone should help the old woman find a placement for Lucy so that plan is in place so the old woman will know well ahead of time that Lucy will be taken care of.
Frustrated
Sad
Sad
INTERESTED
Well considering the fact that I’m a single mother of 4 young children struggling to make ends meet, I would do anything in my power to help that mother and let her know she’s not alone and people really do care
Sad and sickened
How’s my life gonna become in 2024
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9xzOmS&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC7Veaxnlr7Jv2xdR9sjneIpA7WjVOjARBIQ8AgG7OW-Q&oe=6593AF8B
Sad
I would be very upset but I would refer her to a social service agency
Sad guilty
Idk
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-IZK7Y&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB51xHuLiSlnp8K5-zBxyWItd-ELa4ljgrlZP4q3qk42A&oe=6593AF8B
This is confusing - are you asking what they might say? How I might feel?
Sad
Broken hearted
😢
I could never imagine myself not assisting immediately to help fulfill those basic needs
I would feel even better if I was talking to an adult who has had a full life because of the research done by St. Jude
Please stop
Guilty!
African Elephants are much more endangered.
Needed
Helpless
I’d feel terrible if I could do something but took no action
Very sad.. I’d take her pet when she passed
Awful
I’ve been in that position before so I just had to pray and keep going better application doing the best you can I’m 70 years old. I started 20 years ago when I was 50 so you could imagine where I’m at now only making $15 an hour OK
What can I do to help them now and figure the rest out as the day goes on
I would be fearful of the future for my children & grand children. I’ve been to the rain forest in California & seen the beauty & diversity of the plants & animals that grow only there. I know that other rain forests also have a unique environment but that they all are like the lungs of the earth. If they are not preserved on a large scale it will be devastating for the ecosystem. And humanity.
It will make me feel bac
Sick
Nope
Sad
My health isfragile
You can’t try to make me feel guilty
Gee, your not going to guilt me into giving are you?
I don’t know what to say to him. I have never been in that situation.
Happens all the time. Can’t let my heart break
Cared for
Or woman. I would feel sorry that the elected government was not meeting their needs.
Good
It would be heart breaking
Let’s see what opportunities available
Bad and greedy
I would feel helpless to provide assistance
Sad and concerned
There aren’t enough parameters given for my liking
no thanks
I LITERALLY told you I wanted a cause in the US
I don’t plan on having regrets because I do what I can to support good work
I would like to help but would not know how!
I will take her to live with me
IhNe done a lot to prevent this i will do mre
I wood love. It
Proud. Important. Needed.
Sad
I would feel very frustrated initially but then would want to strategize how to navigate the system.
Sad
lousy
Good.
It would break my heart
it would make me feel horrible
Appeal to emotion. Facts are enough for me.
Super bummed.
No
I don’ tknow
I would feel like I made a tiny difference!
V
Very sad
My daughter. Died from a. Now. My son hearty. Attack
Awful
I would feel bad that they weren’t treated properly
sad
stop
That is missed the boat. I want them to experience music and the arts
They might ask for help and if I didn’t help I would feel awful.
I know they would be at a loss. They would feel devastated. My heart would break for them because I know how they feel. I was laid off from my job of 20 years at the age of 48.
I would feel bad, but wonder if Surfrider is really the best charity. Would prefer to prevent plastics in ocean to cleaning up.
First of all sympthize with him and relate in short version how you came through & where they might go for help if you have any to share.
Frustrated and sad.
Terrible
terrible
I would definitely help
It makes me feel like I’ve been drawn into a manipulative conversation
Stop
horrible
They may say I am worthless help to them
not good
Try to find an agency better to take care. Of them. Take her there & make sure it was OK & in her best interest
Proud and happy
Mix of frustrated and sad.
Sad
Anguish
They have 3 days before they are put to death due to overcrowding
I would feel awful
Bad
It would make me feel terrible and I would want to fugue out how I could GET the Help that we neede
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX93B_nB&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBezZh-CkEZ_nLmzERCrP57aW_ZWiOcd-6z_jBHeeaYYw&oe=6593AF8B
Guilty
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8sxFqB&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCSlHdKBvj_uOmjridAmbFek-nUiJU3N6ERSlLtYlZDqQ&oe=6593AF8B
Frustrated and sad.
Great ¡!!!!! If I only could!!!!
I have no grandchildren.
I would give them money or buy some food and give it to them
It would make me want to do something for her, if possible.
I was that child 45 years ago. I never did go to college. Instead, I took typing classes in high school and got a job as a typist. I eventually worked my way up into a better paying job. Just many of my classmates. We worked hard. While education is important, there are many other factors to help yourself get a good job.
Are you talking Palestinians, Ukrainians,
Stop sending me messages
I’d want to help as much as I can on a limited income.
I want out of this ! NOW! No shaming, etc.
ashamed
I have no children, so I’ll never have grandchildren
guity
Defeated
😢
I would want to help
Rotten
I’d like to do what I can.
Sad
Horrible
Good
Horrible
That’s not the right question. I’ve done a lot of work in this space and your question runs down a different path making my answer irrelevant.
I know exactly how that feels
Sad and scared
How can I best help?
wateraid
I am one of those old ladies and have already made arrangements for someone to care for my pets if I should pass before they do. Hopefully I will outlive them
I’ve already donated based on your suggestion
I have those kids. I want the world to survive so they can thrive.
I would feel awful. I sent donations years ago when I was a teen,to save elephants and though it is somewhat improved, poachers still are killing elephants for tgrirbivory snd their habitat is endangered. Actually I try to donate to my local Humane Societies, as well as St Jude. So I guess I am a diverse giver with my limited income to try to help locally and globally both animals and humans.
Stop
I would feel frustrated with the situation
Help
Your post is asinine, to think that preserving the rain forest is more important than preserving the 600 million acres of public land in the USA outside of Alaska, it not a reasoned or knowledgable position.
Horrible
I wouldn’t do nothing I would do something
I can’t imagine not helping this person
I’d feel helpless and sad
.
Helpless and Frustrated
I’d feel that I needed to help her and resolve that issue
Idk
They might say to please help. If I didn’t I would feel guilty
Help
Awful
stop
Sad
I would want to cry.
Please help us.
Upset and frustrated

They: We cannot continue to live here.

Me: I feel the same. I live here too, and we are all in the same boat.
I would feel extremely sad.
give me a link
Not good
Sad,
it would make me feel horrified at the amount of food waste we have in the world and that a child is going hungry because of humanity’s greed. i would want to help this child, their family, but also to end this for childen everywhere. there is no need for anyone in the world to go to bed hungry with the abundance we have.
Possibly suicidal and adrift from my community
Great
https://cdn.fbsbx.com/v/t59.3654-21/414440587_907902197456674_3563561036109738112_n.mp4/audioclip-1703913021000-22522.mp4?_nc_cat=109&ccb=1-7&_nc_sid=d61c36&_nc_ohc=iBjvQXNL24cAX-GTELm&_nc_ht=cdn.fbsbx.com&oh=03_AdT-hqGgJRzTHTcZVczXq_H3R0GmMzkvW1hVy25XMXNCkA&oe=65914A67
Stop
That last set of questions caused me to be suspicious of this entire ““study”“. No more.
This isn’t the Humane Society, right? I hear the HS has a big pile of money that investors take from.
I go out of my way to prevent that from happening.
Embarrassed, then excited that I could help.
It would make me feel horrible about myself. Why can I, as someone well-off, get a good education while they can’t because of something so treatable?
Badly
Nothing
I’m not sure this is for me. But thanks.
Tho I will feel bad because I can’t help him
Pretty bad. I would buy her some groceries.
I would be worried for her. I have been there
I would feel the need to remind my flippant grandchild to put the past behind them and focus on what they can do now.
Angry, frustrated and feeling powerless. By the way I already donate to this charity.
I want to help
What is an AED
I would tell him that he was not alone and his feelings were normal. It would make me feel good to be there for him, even if it was just over the phone.
Good to know
horrible
Sad
Heartbroken
I would feel so sad for the woman and the animal. The fear and loneliness and confusion of the dog, and the worry the woman would feel
Sad
I’d regret not helping
evil
How did this happen?
Horrible
I would feel like I disappointed them. If I knew I could have impacted the planet in a good way and failed to do something about it,I would be ashamed of myself. I have no money, but is there something I can do now, that can help?
Just sent
Terrible
Stop
Okay, I understand how you feel. Does your wife work? Okay with her income and we will help you to apply for unemployment which should help your income while you are training to better yourself for a better position.
Thank you!
Horrible
Charter schools are taking funds away from those public schools, making the situation even worse
Horrible, but if I didn’t have money to give, I would explain that to him, too.
Unworthy, lesser than, a looser
I’ll tutor you.
No thanks STOP
Guilty
i would take them to one if several shelters around the area. i would feed them on the way. And pray with them and love on them
Horrified
I wouldn’t be happy because I couldn’t help and I rather help other people than help myself last.
Very sad and helpless
It would make me feel horrible. Children should understand where their food comes from.
Of course I would feel awful, but I am not indifferent, just not wealthy enough to make a big difference with lavish donations. I wish it were otherwise, but governments and corporations must become more responsive and held accountable.
They feel desperate and helpless
Ineffective
I’m not into imagining.
I will find out for you
Frustrated
Remove end
I couldn’t do that
I guess I don’t understand the question. As a teacher, I know that many children are food insecure, and I feel yucky about it.
I would feel terrible and offer to help learn the 3Rs
Disappointed in myself
I would feel sad for them, but would immediately want to find ways to help. Call friends see if their are any jobs available, seek out government agency. Let them know help if available, don’t give up.
Just made donation
This is actually a standard scenario in many countries.
Stop
““Can I read TRUTH versus being forced to endure Indoctrination?””
Awful
It pains me.
Proud
Devastated.
If I did nothing… shame on me
Fulfilled
helpless
Ohh, this is the research part. I resent guilt. It would be more effective to ask me directly.
Thank you for this excellent survey I’ll be donating to Fedding America Immediately
I’d be grateful for the trust that they have in me, and I would let them know that they are NOT alone. I would be honored to be able to help.
I dont
stop
How can I be most helpful?
Like I need to rell them a story I’ve read, then get them the book.
No grandchildren. But I am currently supporting nuclear energy, which is an important part of the solution.
Reminds me of Peter Singer’s famous essay on poverty
I would be very sad that a child with true potential was not getting the support he needs to be as successful as he is capable of.
Changed my mind
Not sure this one is for me
Horrific
I would tell the child whatever is age appropriate at the time. I would also say that there are better things to drink than cow’s milk. It is a gradual process. And I, personally, would feel sick just thinking how people have been duped into believing how kind factory farming.
Bad
Sick in my stomach
I would hope I could help them out of this bind
Informed and empathetic ready to alert authorities
I cant seem to get the app to complete my joining. It said my payment was accepted then later requested payment, and it seems to lock up when I try to choose a program. Maybe I need a human being?
Sad, angry and sick to my stomach!!!
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8GVdL8&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAT2jMZFdTeZw92-JopxngfLR_bSFgiqT_7up7vgOJ_XA&oe=6595A9CB
Humble
Furious
stop
😲
We didn’t realize how bad it was going to be
Why not help us?
Can you help us? I would want to put them in touch with knowledgeable help.
They would be angry at the world
no
Disappointed and heartbroken
Angry
I support charities, through my actions and limited funds, that help with this problem now and in the future
USA
Great
Selfish and Uncaring about another human being
how do I exit this thing?
ASPCA would do nothing to help Lucy. It’s an organization of lawyers and lobbyists
Sad
Come with me
pained
I would feel sad that the high school girl feels less than.
stop the questions, now
Helpless, frustrated, depressed, angry
Angry
I would tell him he is not alone and this is only temporary, then tell him together we will find resources to help get back on your feet
Sad and concerned
Ok I’m done here
Sad
I can’t imagine giving such a heartless response. I would assure the person that I would help her find a good solution that is best for Lucy.
Guilty
Stop
It makes me sad and I want to help find aftercare for the dog.
Stop
I can’t imagine this situation.
The new road needs to be moved
this wouldn’t happen with me, I cannot imagine it. Plus I do not know who they is.
Please take me off your mailing list. I have made all the donations for this year. I answered your quiz, so now please respect my request.
Well … there is no possibility that I’ll ever have grandchildren, so that’s not really a relevant concern. I am a SCUBA diver though, so I’ve already seen the decline in our coal reefs.
Helpless
Awful I would not do that in the first place
Don’t care
Awful
Sad
If this is really an academic project then you should realize that your Navigator is garbage. I would never give to Amnesty International, which opposes what it sees as dictators on the right but not the left, and which is highly pro-Hamas and anti-Semitic. The choices you gave for a charity were incredibly biased towards the left.
Horrible
I like St. Jude
I’m Actually familiar with Trevor Project and support it
Doing nothing would make me very depressed. In all likelihood, at minimum, I would have given this mother some cash and/or a ride to a motel/hotel.
My grandchildren would be proud
Like I let her down
sadd
Bad
Bereft
Helpless
I am done thank you good bye
There is a team you can join…
STOP
Sad and like a horrible human
Helpless, frustrated, guilty
I already help and want to help but do not like guilt and emotional tactics
Would feel sad for her and would ask her if there was anything I could do to help her enjoy today’s.
Obviously, not doing anything would feel terrible.
They’d probably see me as heartless, privileged, entitled, selfish, and stingy. That shouldn’t make anyone feel good, to be called those things.
stop
I would feel like I haven’t done enough
Please stop
I would feel bad
awful
stop
I want to help. What can I do
My grandchildren are adults and I don’t think all the forests are gone yet.
if you can’t or won’t give me an address, then not for me
I’ll look for the organization. Thanks for the quiz.
I suspect they wouldn’t say much. It is hard to appreciate something like books when never exposed to them. But books help people!learn empathy and dream bigger so I would feel sad for that lack in their lives.
I would try to find shelter for them.
Not good
Good
it would make me feel sad about failing our citizens, there should always be resources to help people improve
Stop
Would be good to help that man
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_L3XsK&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBciqYkCTlmP4Uvg3czRZn6262SBB-hubzKwNvaM2IW3A&oe=6595A9CB
They might say fuck you and I would feel bad
extremely good
Nothing. Why would they speak to me? How would they even know I didn’t help? or that I even could help?
Stop
I’m done. thanks.
Defeated and sad
Sad
https://scontent.xx.fbcdn.net/v/t39.1997-6/851582_369239386556143_1497813874_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=YtFR_nR0sSwAX-cJqUm&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBsQK902D7Shvtg7tFZUn379Yky3Y85P7xgC7X1Y2VVWw&oe=6595B411
I won’t have grandchildren
Terrible. But I have another concern. I don’t want begging letters throughout the year. One is enough. I don’t want “gifts” to thank me. I want my donation to support the cause.
please go away… I do not wish any further contact
Temperate rainforests?
In the first place, I would give them out of my own supplies and try to HELP her find help.
horrible
Isend donations monthly to ASPCA and Humane society.
terrible
What makes you think women will be given credit now when they’ve had it taken from them at every time in the past
on the job injury
Call you heartless & feel like you don’t really care about th e animals but just want to be acknowledged as someone who cares but didn’t want to did the work.
I’m not interested
Exit
Guilty and full of despair
I would feel guilty for not helping where I could be of assistance
I love kids
Thankfully, I give to Samaritan’s Purse, which helps farming families like his.
Wait, why would I have done nothing to help Lucy?
very bad
What was the question
Guilty
They’d say, help us please. And I’d want to.
Extremely sad
Teen, not team. Fix that and let’s go on.
I must find a way to help meet his needs
I would feel sad and guilty if I didn’t do anything.
sad
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9goTDz&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBrV6aIiYQpVJ0Xojek-oiMcxrJ34f3ENrIs9dEPAeByA&oe=6595A9CB
Good. It would make me feel good. What does that have to do with cancer?
I would feel awful. It would.be horrible to be in that situation
No grandchildren. I do what I do for the environment because I am part of the web of life and I want to be a positive force.
CEO gets too much money
Sad
Sorry but my texting skills are inadequate to make my best response
Sad, I would want to help
You chose the wrong charity
Motivated to get them a set of books
Bas
I was that mom. I cannot let a child go hungry
Depressed and ashamed
😕
I would do something to help her! St. Vincent de Paul, Salvation Army, Hearts with a Mission, several churches I know of……I would fine help for her!
I would feel very bad.
Tired
Sad and hurt
Good
Sad
Determined
Stop
Sad and embarrassed.
pissed
Sad
Inot good
Horrible
What am I supposed to say?
Ok
Extremely bad
THEY WOULD THINK I WAS COLD HEARTED! I WOULD FEEL LIKE I LET THEM DOWN !
Guilty
I would feel bad
Stop
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_CETS0&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCkegp6abSxehzjCJgudX1-DFXx_Gq7zz6syF90L7cqnw&oe=6595A9CB
Sad
I’d feel as though I should help in some way.
Stop
That would make me feel bad
Sad
would be very happy to be helping
Awful
Bad
Stop
  1. Call my church group, which has excellent connections with government and private organizations that offer intermediate and long-term solutions.
Like garbage
I know they’re coming and I do what I can as an individual, but that’s not enough
Like I could have helped but didn’t
stop
Helpless
Sounds like you are guilt tripping me
This question feels … manipulative, and obvious. I’d feel bad for her.
Stop
Sad and wondering how to help
Guilty
I’m done. Thank you.
It should never be allowed to happen. These animals have feelings and souls. Their lives should have meaning and happiness.
Sad
I’d feel joy.
Shitty
Like reading IS fundamental.
Sad
I would feel horrible….but i am already doing this in my personal life
terrible
It would make me feel shitty
Bad
STOP
Terrible and embarassed.
It would make me feel fulfilled.
good
Good
unchristian
helpless
I’ve been that mother I know how that makes me feel
Depressed
I find your survey to be a bit too narrow! I would feel obligated to help in that situation, but you missed the mark on my charity. There are others that are similar that I consistently support. You might try some “check all that apply” options in your survey! 🙃
horrible
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX8w51sA&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCq2tCV-pCeU6r1GKvRw0cY69CUwJlFSuSOY9WRBDmMcw&oe=6597A40B
Buy the food
Sad
I would not smile politely and say nothing
I’ve done what I could over the past 45 years to help slow down the deterioration of our climate & environment, and to make personal choices that help protect our planet. But it will take EVERYONE, all pulling together, to save us. To save our planet, we must start with saving the oceans, which are filling up with toxic wastes & plastic. There are enormous Dead Zones in the oceans now, and areas 100s of miles across that are just plastic waste. We must reverse this damage!
It would make me angry that whoever he works for doesn’t take care of him when he has a known complication endemic to his workplace.
Terrible!
There are plenty of opportunities. Some you will have to create.
It would depend on the circumstances Not guilty
Like a real asshole
I have already discussed the likelihood of extreme weather with their parents.
Sad
Disappointed
Sad
Can’t imagine but find your quiz missing the thing that always stops me from giving: the CEO’s salary and take home pay.
Terrible
Like a schmuck
I don’t like this kind of forced response and roll playing, it’s not part of picking a charity
give her help getting to school
Guilty.
It is not Christian to turn away the homeless and the hungry, I try to follow Christ is what charities I give to.
I would take their information and strive to help him find employment, even if it was initially temporary
sense of well being
Broken hearted.
I can’t do this now. I have to go out.
no grandchildren
Why didn’t people stop this?
😀I’d feel bad. Would strive to share knowledge of BRAC (along with Heifer Intern’l; Peace Corp, etc) as resources.
I would find her shelter
terribly guilty
Here’s the thing… I have already given to NRDC and other, similar charities. So I’d have to tell those kids I tired, I helped, but maybe I could have done more. Or maybe the problem exceeded the reach of any organization and could only be solved by Nations, who decided to do otherwise.
Contact Samaritans Purse
It will get better.
I’d want to take the dog myself
If I had it I would be sad
Frustrated
Guilty
I’ve learned enough. I did not know about this charity, but I had guessed that my answers might have said Heifer International, which I already support. Thank you for introducing me to BRAC.
helpless
I am so sorry. You should always feel safe and free to live your life, wherever you are. I am sorry I didn’t help you then, as I didn’t know what I could do, but I want to learn and I want to follow whatever steps I can to help, right now.
My kids aren’t going to have children. They are both concerned that in as little as their children’s or grandchildren’s generation the point of no return for the Earth’s climate. I share their concern.
Ther are two possible answers. 1 could provide bussung for the area children or 2 provide for closer schooli0ng.
awful
Guilty
Terrible
i’m finished, you gave me a charity that actually has spoken out against victims of major violence against women. I feel more alone than ever. As a counselor I would not be doing nothing, I’d be helping her get in touch with the proper authorities to assure her safety.
Sad,angry
I’d say ““let’s find out how we can help.””
I myself, am in that situation. I am resisting getting another animal for fear of dying before them. As a volunteer (donator) I would do my best to help them find a friend or family to assist. I would let them know there are rescues out there that can assist in this type of situation & keep donating!
I am not interested on going further.
Terrible
I prefer to help wild animals in the U.S.
That would make me feel very sad cause I’ve be their myself
STOP
Heartbroken
I would feel like I needed to help her and set her mind at ease
🙁
Guilty
Great. I have given before
wanting to improve the accessibility to clean water. Humans need water to survive.
Very angry and very sad
helpless
I went to your site directly so no need to keep DMing me
terrible!
Awful
Go piss up a rope.
stop
It would make me feel like I wanted to help, to be able to direct this person to a known agency where she can get assistance.
I would refer them to local homeless navigation service with which I volunteer, and possibly to a temporary situation that helps women coming out of prison or rehab.
Stop for the second time.
Blessed
Miserable
Would want to help
I have no response to this.
Awful
I’d feel sad but instead of giving to an individual I’d give to Salvation Army or Star of Hope. Tell him to go to (SA) for assistance.
Selfish and entitled
I would feel helpless.
sad
I like treating for his pain
I’m not sure I follow this question.
It would make me sad that the government didn’t step in to help.
SAD.
Frustrated
Not to good
Sad
This would make me feel badly. But that said, the five options to support education were too narrow and Girls Inc is not my charity soulmate
I would never leave them take them home with me
Yes!
I would be sad and a little bit angry that I didn’t do something to help.
I would feel like a failure and like I was behaving irresponsibly for years.
yes
Ashamed
I have no idea
I would pray
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX_Gq7Rg&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCMgk6znk5Kf3h1rjzWv7RBCRIYbya5Evmn1ZjMMt2moA&oe=656E1CCB
Awful
Very Heartbroken
I’ll be okay
Sad very sad where god wen we need them
lousy
Good
IF I DID NOT USE ALL OPPORTUNITIES, I WOULD BE A HEAL
I’m retired and I have a part time job
I’ll feel bad to that girl because,it means that am not helping the community at large
Good
Im here to help. How do I apply for membership to charity navigator
good
sad
I’m sorry here is soon food.
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX-jZfbl&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfASBAugQ8iCiaJoPXrKteRY0pDd_Ls6NNrGsj4Z08_gpg&oe=6570170B
I am a retired special educator. It would break my heart.
Good
delete my account
I’d want to help them get training to learn another job and keep family safe and fed
😢
I would probably let them stay at my house
Terrible
horrible
I would feel proud
We need your help
I would feel very bad & very guilty for not trying to help
Well
Okay
STOP!! I’m leaving
Sad
WONDERFUL
I sent in money, but not enough people did.
Please don’t
https://scontent.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=vUKirSMiXxIAX_cTnPz&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCtFZOkJBeX2HLCv0eIYmI0CIQZoZiJcPw3PTgK7AnvsA&oe=65755C06
What about St. Jude??
Iam not understanding any think please start from introduction and tell me what is about with charity navigator
It would make me feel sad n inadequate.
Shame. But I don’t choose that as an ideal motivator.
Sad
I wish I could help
It would make me feel guilty, I always feel guilty about my good luck
There’s no arrow
Sad
I want to run away from Afghanistan I want to escape from violence I hate the Taliban terrorist group Please take me out of Afghanistan
It would make me feel bad bc that a child wasn’t able or know how to read bc I love to read
Better imagined
Horrible
I never turned a trying family down for food
Like I need to support Hadassah that has global impact
a lot would depend on what the child said. if they requested a book i’d go get them one.
Hurt for them and sad for them and if have I a help them too.
I have a dream about my dog and my dog family will take care my dog 🐕 they all him
Devastated for him
done all this in my working life
Please stop I am not participating.
He might ask for help for his family and I would find an organization that sould help him.
Sad
MAKE ME FEEL HURT AND BAD NOT TRYING TO HELP
What respons
Angry
If I were in that position I would welcome any sourcing idea I could find to provide for my family.Thank God I only look out for myself.struggle is real.
Interesting.
I would be very upset
Sad
I used to take food to pold people that are sick
i make sure ,go out an get food
It would make me feel bad that Lucy would be without a home. However, money can be set aside for her care and Lucy can be sent to a breed specific rescue that could provide for her needs. Any funds that are donated can help offset the funds needed to care for Lucy until a ““forever”” home can be found.
Why didn’t anybody tried to save the planet and animals to be here for the younger generation
My will would be for my pets care
Yes!
https://scontent-ord5-1.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX83-brB&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-1.xx&oh=00_AfB2b2UHMy4BsFwGhfrvYdigfV092TYcU1ZWVsHcCFVnTg&oe=6579FA4B
Goodbye
If I wouldn’t do anything to help it would make me feel like a real piece of crap
Awful.
I am a Christian I believe in prayers and they won’t really work
Sad but incompetent
They might say iam wicked and me too by their response i may loose my peace
Sad
I would fill very much sad because I could not Help this MAN But I am not going to just level it along I am going to Help this MAN anyway I can and get the world out about His problems so We can start doing something about it so no one else hast to we’re when a problem comes up we all need to come together as one nation again and stand as one with God and be thair for each other Amen
It would break my heart
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_aszf5&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfD5llGvMNNgEdEhBk5F5yfUC3_fyuZ9ojoVaXUg5VoRZg&oe=657BF48B
I do more than I should and all that I can so good bye
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX-ZBRyD&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA63xidys-NTQwCetZvY1Pp12rBCqdXpG5m7TJTTK9o_g&oe=657BF48B
Sad
Please find a good pantry locally to help give you some food.
Heartbroken
I would be sad
Like crap
Not very good
It will be a shame
Sad
In that part, I have to give a realistic thought, I can not come up an exact answers yet…
sad
I wouldn’t buy milk from that company. I’m an informed consumer.
I no someone like that
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX9VykSk&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAypNunGfPkR2pHEQnSgL2VKrakAqeCpYCXKG-AYePOQA&oe=657FE90B
I want all children to read it will make me very sad if they don,t have books
I would try to help them TH best way I could . That would b a sad situation
Frustrated.
They’re going to tell me that nothing works and I need to look deeper to help them and that’s going to make me sad but it helps to to looking for more solution to help
Bad
No I’m done
Yes
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX-A47Db&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC1kmu3-VTvYdwQyod8cGtQzQyrSAB_dq0mSulVfzH_Tg&oe=657FE90B
Well I would help much as I can to show how much I really care from my heart
Makes me sad.
They may say how could people allow this to happen, my response would be it’s big business that the greed within us why it happened. The oil and pharmacidal company’s are just a couple at fault.
I had to run take care of my grandchildren . Sorry but will have to wait.
Honey, I have seen it all in my lifetime. My first job was interviewing potential tenants of low income housing. My next job was interviewing candidates for entry level office and factory jobs at Reynolds and Reynolds. As we know our own lives can also have a few hard knocks at times. It’s been nice talking with you. Thank you.
I want everyone in the world to have clean water
where is this most prevalent?
Awful.
Curious about your database
We would help with all her needs.
Good bye
Terrible
My wife has beaten cancer 4 times in 19 years we have been together We went to UCSF HELLEN DILLARD CANCER CENTER in San Francisco, California Actually she had cancer last year now it’s been one year cancer free It is a very hard road to travel alot of ups and downs and treatment sucks for everyone the patient and the ones who have to watch then go through treatment because there is nothing we can do to help Just make them comfortable as possible and make sure they eat something I know this because I have seen through this many times
I would first listen to see where she was coming from I would encourage her and inspire her to reach out to any local non-profit that could assist her in getting the legal help she needed to get her job back if she wanted her job back but I would definitely make sure that she spoke out and made sure her rights were taken care of
I’d tell them I wish I’d gone to college took all the right courses so I could have tried harder but I did what I could for a mother in a middle class family.So they should change the world if they can.
Terrible
not
0leasr somebody help me, why did you leave me, why don’t you or anyone love me help me I’m hungry cold and in pain how could you do this to me all I wanted was 7our love and caring. I still love you please don’t leave me come get me
Up set. No one deserves to be treated that way.
Sad
And what’s that Taylor
Pretty dam bad . No internet for advice
Okay I have what I need - no hard sell needed. Thank you
I would be upset. I would want to do something
I would not feel good about i, I would have to change my ways, in order to help him..
Stop
I would understand his feelings. I would be worried about him. I would try to help him.
I could not see me not trying to her them in any way i could
Helpless
I’m going through an eviction and I’m going to be evicted on December 26th! I went to several government agencies and they told me that I don’t make enough money for them to help me, and my family and 2 dogs! I’m 58 years old and I have never asked for help! Besides Medicaid! I went to them Friday and was told my case was closed ! And I don’t have Medicaid anymore!! All they are doing is giving me is $90.00 in Snap! I started applying for help in September and never met or even saw what my caseworker looked like! And was not advised that my case w closed!! So I would never be in that position! If that were to happen to me now in my situation I would do anything for them!!
I would stop the procedure and adopt her dog and allow her dog to live out his/or her Life
Sad don’t want to leave my dog with anyone
Ssd
Thank them for their service and direct them to helpful organizations in the community as I and ““elderly and couldn’t help them financially. Possibly make them a meal at times.
Learning a trade will make my live, my community, my children improve our lives.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX80RCRa&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCoeHa2QYfBwLoEnq5_NWfbBaCW0YzlncRlIzc_EicZtw&oe=6583DD8B
It would make me feel awful
Happy
Awful
Exactly
We’ve given to Chef Jose previously. Can’t think of the name of his charity.
I will be very worried
good about myself
I would convince them that a better life lies ahead.
I may easily give them some relief
Inspired to support a way to get books for everyone!
I would feel helpless and sorry for her.
Terrible
having another heart suy
I would help you
Change your testing to listen to what they want .
Motivated
Food and money is good felling
Stop
Sad
Bad
Sad and guilty
Sad
I agreed to take a quiz, not to write some inane essay on how someone else would feel if I did or didn’t give to a particular charity. Sorry.
Sad, with a strong desire to help
Bad
It’s more important, I can make me feel bad
Sorry, I’m disappointed with the quiz, and I’m done
awful
https://scontent.xx.fbcdn.net/v/t1.15752-9/371514711_1020191715985169_4903525810189975850_n.jpg?_nc_cat=108&ccb=1-7&_nc_sid=b65b05&_nc_ohc=KaRNmXxoY60AX8wu_-4&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=03_AdSvllIkdOP5By1t-Sr9JKGTtiBRjSNSKLNI7uD8Z4Pm9w&oe=65AC8055
I would be incensed on her behalf and eager to take on the employer, even though I don’t have the resources to do so myself.
Insulted and ashamed
I’m loss for words
Bad
I would help her and her child find shelter to keep them warm give them food
I have been in this position bedore
Would feel bad
sad
Not good
Very bad
https://cdn.fbsbx.com/v/t59.3654-21/413634773_7080641835361888_6438494061724087099_n.mp4/audioclip-1703264708000-6502.mp4?_nc_cat=111&ccb=1-7&_nc_sid=d61c36&_nc_ohc=_dg27M09LvsAX-uT-bH&_nc_oc=AQlFCm72UDP_GMcjMZOm7VtdGKzUTDubnVoQHlR_4xu8JvOOCHNrHQd6CpnAwLEwaEktvxQ3MvH-6npcpkXqyT2a&_nc_ht=cdn.fbsbx.com&oh=03_AdRJInde0SDZFs3J4MKCC8oS--b7LzNTMkcY-UsxH-XRwg&oe=6587ADDF
Like a hero
Useless
stop
No $
They would be horrified, they would hate me.
Awful
I would feel bad for the animals and people helping them. However, it is ultimately not up to me. I am powerless to this. I do not have a habitat for them. I can rescue a dog. I can care for my local nature. I cannot do anything for a lion
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX_Z28H3&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCQMl6Nvi3vFjt__APS-FnKNz3y5PxyJ_dZXyo9aIozbA&oe=658BC68B
Look in the fridge to see what is in there
I would do nothing? Not possible
I would be sad and frustrated about the situation
Please Help, and I would.
it would make me feel good, but honestly, animals are more my thing
Ashamed, and angry at those who caused the pollution in the first place.
I would feel determined to get this child a library card and signed up to Dolly Parton’s program
Yes
I will feel better
sad
honored
Sad, and looking for a way to help both her and her dog.Also feeling a need to reassure her that all will be well, and have solutions for her concerns.
i would feel good and inportant
please end chat
No
stop
Heart broken
I currently visit my local supermarket and pay for groceries for indigent families.
Helpless and angry
SAD
Very bad
I’d feel very bad
That I would be very sad and I will offer them a place in my home until I got them a place for them to call home
I have someone close to me who may have witnessed this I will hate that
I would be unhappy because I didn’t do anything to keep our environment clean for them
Feel bad 😔
Stop
Sisters
Selfish
Grateful to be able to help
If I had the means to take care of her dog I would bring it home with me.
idk
Some of us did our best, some people were just too stupid to combat
mi número de teléfono es (475 )800_53 92
What can I do to help?
Awful
Idk
Very upset and saddened.
Useless
I stop
Wonderful. I would feel I have achieved my goal of paying it forward.
Great. I already donate to this organization
bad
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8J0DdT&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCgRCTEK4pV520adecUdV99DwNMCP8w54Nzcy8KHVNVCg&oe=658FBB0B
Why would I smile politely and do nothing? I would have them contact the civil liberties union or the local Barr association
Great
Sad
Awful I’m sure. Will not want milk anymore
How would it make me feel if I knew there were veterans missing limbs or who have PT
Pissed
Stop
Upset
Not now
Helping humankind is important. I’d check myself to know what I could do the do it.
good
Ok
Sad
Doesn’t surprise me. I already support SPLC. Thanks!
I don’t want a guilt trip, but thanks anyway
quit
Bad
I would want to help however I could for them.
NIGGER
Why would I ever imagine this? I do not appreciate this clumsy, ham-fisted attempt at emotional manipulation. Do not bother contacting me again.
Stop
I am sending you because I need your help in educating my children
Sad, upset with self
Demoralized.
I would be more likely to assist them
She won’t get help!!!!! They don’t support local shelters
Sad and fairlyhelpless
Perplexed
Sad
I primarily help African elephants as India is a wealthy country capable of paying its own way for its animals.
Useful
Like a piece of shit !!!!!!!!!!!!!!!!
Why didn’t you help me and defend me? I would feel really bad and helpless
Sad
Can I start over?
Who?
This is a stupid bot. Takes forecast and no real answers
It wood make me feel so good
Good
There is no listed charity.
https://scontent.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=4BYwTPs5EB8AX8_qWZB&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAvbtVT44aCWYOySWNeNDf2vaAWAX_Lme3pv-iRnfBBjA&oe=659305C6
Got it. Thank you.
Sad
I would look for a local rescue to help her.
She should apply for Ebt card&problem sloved
I would very much like to end this discussion please remove me from your messages
I would feel that I needed to help in some way.
That feels a little manipulative which turns me off
Shit
I would feel sad
Good
Thanks.
I am that teacher in a private school classroom.
I would hope that I could provide some type of assistance to them. It would make me sad.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-qO5AG&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCT0GwP6Xwe6wb6cRbRsgrVlkBEW1rKm2qf4Q00D1Yshw&oe=6593AF8B
No interest in supporting this charity
I do like the charity proposed.
As an ecologist, every day it is my mission to conserve and preserve all creation, so they will know Grandma did her best.
I think me feeling like extinction was my fault because I didn’t give to a charity would mean I was emotionally very unhealthy… I wouldn’t want to model that for a child… that the failures of the human race could be her fault alone if she doesn’t give money away
Oh my goodness sad
I’d like to help, within reason.
Like 💩
Express that no one cares. I would feel hopeless and lousy. BUT Catholc Charities and the Red Cross would be a good place to start and an immediate need can be met with various shelters.
Terrible
Guilty
What do you need to feel safe in your home?
Horrible
sad
We are suffering here.
It would make me feel awful.
No
I dont care as long as the ones who need help get it immediately
I’d say I apologize for not trying hard enough to get the help you needed and that I wI’ll see what I can do for your village students
It make me fill hurt with tears sad
Feed them
Imagine not having a home
bad
Remorseful
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8Vmkgd&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAHlhtaMvDrOfpLDJhX56PLJ4AWhDpFobD72RD_S9iebQ&oe=6595A9CB
I would feel very sad.
I protected habitat where I lived
Concerned and compassionate
Never contributed to Feeding America before. I give regularly to my local foof pantry network.
Sounds interesting and real.
fine
Good bye! You don’t read my answers!
So sad
Terrible
?
What is the exact name of the Charity? Is it affiliated with the Urban Institute?
????????????
sad
stop
ok … I will tell you what’s wrong with this survey … I would pick several options … I do not give to charities where the CEO makes too big a salary.
condemned
Been there done that !
Heart sick
It isn’t at all how I feel. I want them fed and to have at least the basics to make it through a week.
Guilty and angry that she’s had No clean water
I don’t think this is for me. I need help myself. But thank you
Stop
I wouldn’t feel good
Sad
Does it charge anything, what do I need to do?
I would wanna help
Alont
Done
I wouldn’t. I already run an aid organization focused on bringing immediate aid for people in need, currently in Ukraine.
Happy
needing to help
Shitty
Bad
sad
Embarrassed
Gratified
Fine
This too shall pass
I’d be heartbroken.
Go now
stop
sad
terrible
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_MpOG_&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC2yNT1yGwEV96mirO5HeU_S5r_3jfSC3cwi7YIdMl0HQ&oe=6597A40B
I absolutely would do something. If I couldn’t take the animal in, myself, I’d help find it a home.
I’m finished with you. Good night. GBWY
Yes
Man that really hurts in my heart and gut my throat is tightening as well and I’m feeling puke arise in my throat . I would want to protect a animals why isn’t there help foe this lil dog im useless I agree
I would feel sad that the lions are being put in danger and I would want to help any way I can
Frustrated
Very sad
If will make feel unhappy
The old generation is so irresponsible
I really feel bad
data %>% select(treatment_FR) %>% kable("html", col.names=(c("Response to Opportunity Text"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Response to Opportunity Text
I’d rather save penguins
Ok
great
They might say they were grateful for the opportunity they had, and I would feel glad that I had helped to make it possible.
That would be wonderful if there was a lot of this taking place.
Such greatly fulfilled
Would feel great
Happy
imagine, talking to a young woman who knows she is dying from a rare form of cancer and there is no treatment of all, and no clinical trials. A young woman who was married for a year and a half and pregnant, who lost the baby and was told there was nothing anyone could do. I’ve been there, thank you. I can’t even explain how I felt and still do.
Fantastic 😍
I would feel blessed ,happy
This would make me sad but for the old person it would give them great comfort to nknow there pet is taken care of
I would feel like I actually helped someone that was thankful
I don’t take in people anymore. Reason: cause I know from experience that everybody falls on hard times sometime. And I took in 100 people in my house over a5 year period. To help them get back on their feet. And ended up throwing 90 of them out. Cause they weren’t making an effort for themselves or wouldn’t contribute to the house. Like: help clean up, do some yard work, or go get a food box. So it doesn’t take long I see what they are doing. Nothing.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX_v0WhK&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA2T-AN-E2ThB4C8ExO5YyoLl5Pn33sQ3OFKEObvZSiwg&oe=656A284B
Thankyou
I can’t donate, I want to volunteer.
I would feel really good knowing I was able to help
I’m not really into having anything thank me for something everyone should just do
NO
No
Text me please 5182601714
Never mind
Good
Very happy for him
I would not take any credit what so ever. I would thank God for moving in the right place at the right time We serve an awesome God
Happy and excited that they were able to learn something to help theirself
That they would feel grateful and thankful for what they have
Bad
I would feel very good to have found her and her baby a safe place to stay
Make him feel wonderful about himself. Value’s
It would make me feel great!
I am a caregiver already 🥰
Cool grandma. That I’m teaching how to love and save all animals.
Empathetic
Great
Wonderful
Hopefully, they would say ““Thank you”“, and I would say ’You’re welcome””
I’d be happy and touched
I just did what The LORD wants me to do but it’s not enough!
good
That would be an amazing feeling.
I don’t know
Great
Thank you
not sure
Eh🤷🏻‍♀️ I probably won’t have grandchildren so that doesn’t resonate
They’d probably cuss me. Everyone else does.🤨
At least the name
Horny
It makes me feel good and proud. I’ve been homeless for the last 2 years and I feel unbarrassed, humiliated and degraded
Content and happy
Great all they need is love and taken care of mine are like my kids ❤️ I feed coons and cats ans deer 🦌 every night.
I would feel great
That would really make me happy
Stop
Would make me feel great!
Not interested
Glad!
That would make me feel really good
It would make me happy, however I would like to be a part of the person’s journey of learning to read the book. Not just giving money. Time and effort are more important to me.
I would be happy that l was able to be of help
Probably why is my grandpa chasing my child and he has a bad heart I don’t know
So awesome and great wat a beautiful world we live in why wat is going on
Thank you
Greatful that I could help
Not needed
Accomplished and special to my grandchild
Thank u, so much….Good…
Awsome
I would feel good
worthwhile
It would make me feel good
Happy and blessed
Terrible
Sad
Good
Ok
Good
It’s not about how it would make me personally feel but the animals. Just knowing I’ve attributed to helping them would be more than enough recognition for me.
relieved to know they are safe and sheltered
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX9FHJq_&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDA2hqvTHIlu9fZ6egdunW3sKhmYd005vfKl3R-lKHwfw&oe=656E1CCB
This would make me feel wonderful
I’ve been in that situation and it’s a good feeling to have someone to reach out to help you like that
Your love of reading and learning warms the cockles of my heart!
Great
Unfortunately, that is not a good example for me. I Am 84 and not techie. But if I were more competent I I would be honored to Make such a contribution.
It doesn’t matter what they say to me or how I feel it’s about doing the right things
If it would help him to get a well paying job, I would be happy 😊😊😊
Not interested. Sorry thanks for charity tip though
It would make me feel I gave to save so many after I am gone. I am 76. I have another charity near my heart saving feral cats and abandoned animals. (Dogs). Also, wild life.
Good
Great
I don’t know my answer would be probably I feel probably good about it that I help that person with there dog
It would make me jealous cause I need a home
Very good
Awesome
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX8csLYf&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAQ8ZbZd_4nZ8KgtAQRG8P8s2R08BGgCXXJUg3_ceytoA&oe=656E1CCB
Very helpful to help others in need
I am already a volunteer for feeding America.
I would want to help
effective
Awesome
Help me read
It would be great I’d be very proud.
Ok
Wonderful
Not sure.
THAT IS A REAL WORKER NOT ONE FOR SETTING AROUND A REAL GO WORKER ONE THAT IS FULL OF WORK AND NOT JUST ACTING LIKE A NOW IT ALL WILLING TO TRY DIFF THINGS AND NOT COMPLAIN DO THE JOB AS ASKED IF NEED HELP AND DONT COMPLAINNE
Very good
Sad
So good for the folks that could find out about it and understand that they could help themselves and their families. After working with the USO as a volunteer for over 30 years and helping our military and their families I know that feeling!?
I would pet the dog
I’m broke sorry
It would make me feel good to know i was able to help
Great
Hopeful, and proud.
sure
It would make me feel awsome
Happy that it also rained to help the crops grow!
Go away
Thank you
I would feel that I did what I was called to do and that it was successful.
Great
I’ve done this. I’ve been a social worker for 30 years
I do not want to respond you are harassing me
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX-cVkBu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfBGdepW7gvNaJI0DfSYGn8jZlMijy9vmmNuW-Pt8_qWiw&oe=6570170B
This would make me feel great.
happy
sad
Like I am doing something worthwhile
I would feel like I was making a difference
Ok
I am concerned about all waterways and believing it a Crime Against Humanity to cause water pollution
They would say thank you very much and I would say God bless you
I would not care ‼️
All warm and fuzzy inside, happy
I done that
Humble that I was able to help her in her time of need
I would feel grateful that he was able to get the help he needed to live a long healthy life and I would also want to help the homeless and the animals anyone that needs help if I were able to help
Good
No thanks
Awesome
gratified
It would make me feel great.
I would feel great, after a while I’d have to feed the family again and realize that while I keep feeding them they won’t plant seeds, they become dependent on someone to feed them and over time they lose their knowledge
Well of course I would love that but I also want to stop animal cruelty with domestic animals of course and that is my first choice
Happy
I’m homeless
Amazing
Happy knowing I can help and give hope to someone
I think it would be great
Happy and very good
My son is going thru Gleoblastoma, that’s why I send money to St Jude. I will look into Dana-Farber.
I would feel good about helping them
Thankful
Happy
I would would be able to go to sleep that night knowing they were safe for that night.
wanting to help that person to get the help she needed and find it.
Good
Not for me
Good
it would mean the world to me just to know that the baby was taken care of
Sad
How is it possible, they’d say
Very thankful
I’m blessed
Makes me feel really good. But let’s safe Elephants from poachers
If I’d contribute to the work that lead to the take down they would say you should have stayed out of our way, now you are in danger, I’d be very afraid.
Should make them feel excited that they’re needs are being met , great job which can provide the help they need and more opportunities
I would feel good inside knowing that I was able to help someone because it is scary very scary but lean on the Lord too the Lord help you get through everything
Great
“You are most welcome” with a smile!
I will give Lucy to a. Very good home , I would adopt her Ina second
I’m not in to that
I don’t care
It would make me feel invisible!
I would feel accomplished empowered and zen.
I would be so very very happy within my soul
It would make me proud. I would be thankful that my efforts produced a positive outcome.
I feel I did a good deed
They would be gracious in speech and thankful. I would feel worthy of another day on earth
Good
Strong
I would love to be one of a team helping refugees find new homes and employment.
I want to help the Palestinians being slaughtered by Israel. Can you just find me that one ?
Amazing that I can feed a family
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX_3ELMK&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDFD7AWsSEcuQqqoy1yaBM4b88YRJ1Q_Jz8v-s-8y9qGg&oe=6572114B
Been there for awhile now.
Blessed to have been able to help
Depressed however happy to be inside and warm
I would feel like a good person
I would feel great knowing that I’ve helped someone. That’s what we all need to do is try helping someone.
Yes
That would be awesome but right now I have no money because I got my Heart 💗 broken and scammed trying to get a puppy
Sad
It would make me so happy and excited
I still thinking.
Proud and useful
Good
What
Like I made a difference.
Thanks. Great.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX-eaDhb&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDnO4qN272FXSWmH34iXkeJ2VHi3ye8R32xyse3Xwm_OA&oe=65740B8B
Good
It would make me feel happy that i was able to help him.
Make hreat
If I can help I would feel good.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX9FkicO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCZrlQ13XGPlKuPuzyTDv5VutY-dAdOj1lWNfehjwPviA&oe=6572114B
ok
Pretty satisfied
Thank you, Granny
Grateful I was able to help.
I’ll be hurt
Better.
Good!
Thankful
Where do you live
It’s would make me feel like someone cares about me be amazing
They would feel safe
Was able to help, someone that needs a new start
Yes
It would make my heart full and very happy.
https://cdn.fbsbx.com/v/t59.3654-21/408099449_7041222199254705_1094935351253789165_n.mp4/audioclip-1701668125000-169018.mp4?_nc_cat=100&ccb=1-7&_nc_sid=d61c36&_nc_ohc=1ClPjsX4HZkAX-8fqGC&_nc_ht=cdn.fbsbx.com&oh=03_AdST2oApC3nERJ0419f-jh7gmZzd4XNGBHst49mbnsbbCA&oe=656F1CA1
Great knowing they was safe
If I helped someone write a program that helped people get jobs, I would try to see what else I could do to help more people get jobs.
I feel good about it
They would thank be in a most grateful manner.
Good
Happy
I would be happy
I’m not Big on reading for real but if it means a Chile will learn from it then I’d decate my all
Awesome
I’m a retired nurse an my daughter has cancer
Amazing
Very good. I already give to Feeding Tampa Bay which is a subset of Feeding America.
It would make me feel good to know we help her get out of legal human trafficking I say this because government is getting paid to hold a innocent person against their wheel just for money
I would appreciate they were a beneficiary of the agency
I would feel great knowing I helped people. However
I already give monthly all I can afford to Tunnel to Towers. Can’t give anymore!
Ya
I am so happy for than
Good
Like I did a small part of a huge project that will never be completed
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX9f4zU-&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCCmcRZbNrKLt-hxX3h8JqjPIz4r3s5pdQuEtKpVmHehg&oe=6572114B
Very good
Very happy to know they were in a warm place and out of the cold.
yes
Thanks for making me feel safe
No
I feel glad that I got to help save the dog and got the dog to loving people 💯 ❤️
too busy now
I think I will pass. Because I already have charities that I donate to in the u. Yes. And they are very good and very reliabut thank you for your offer
I would feel good knowing her pet would be taken care of after she is gone.
No idea?
I would feel great and give all the glory to God!!
I feel very. Happy that I made someone day
Helpful
what respinse
Make me feel good
It would matter
What the f……
Very special and important
Even stronger and more determined
I have had family members and friends that have died from cancer. When a cure is found for cancer that will be wonderful.
I would feel r
I do appreciate you letting us adopt Lucy. Please come visit her anytime
Upset
So great. Od be on tears
It would be fantastic.
Don’t worry, things will be ok.Keep your little one’s safe fed and warm.
I would ALWAYS quite him to help animals in distress and to always be kind to God’s creatures. You tell ALOT about a person on how they treat animals.
I would feel pretty damn proud of myself for knowing that I funded that research to make that happen for her and millions others like her in those types of situations
Sounds good to me
I would tell her not be afraid, we are here to help
Like I am helping….
They are old enough to know
Thankful that I was able to help someone to continue or better their life style.
It brings me to tears. I want no animal to be homeless hungry or abused
Honestly, I would feel like crap; no one should have to thank me or anyone else for having their basic needs met. People shouldn’t need to imagine an interaction with the recipients of philanthropy in order to participate in the act of joyful giving. I think that this mentality only furthers the otherization of the people nonprofits serve.
I would feel good in that situation.
I would feel very happy for her and feel good that I was able to make an important difference in someone’s life.
The rainforest needs time to grow, and if people cut down all the trees and pollute the water, it will be bad for all life there, plants, animals, even humans.
I’ve donated many books children and adults. They are overjoyed and so am i
Happy that I can make it difference!
Bless
Good
I can’t I need help
end
It would make me feel good
good
It would make me feel good that I was able to help them
I would be happy for him.
IS THERE ANYTHING I CAN HELP YOU WITH PUTTING THE KIDS TO BED BABE OR I WOULD GET UP AND HELP HER AS A TEAM
Great
Good
not sure would want to do more for he and ckild offe [emenent housing with me
Happy and empowered
Bad
Very glad
Honestly, I would take the animal into my own home to care for it until their time comes.
GREAT
Glad to do it.But, you didn’t give me a place to type it.
Maybe later
Wonderful

he might say thanks for your help. I appreciate it.

I would feel like I did what I thought was necessary & feel good about helping that person prosper in his future
I would probably be moved to tears. People with Down’s Syndrome are some of the sweetest people on the planet. I had a career working with those that have physical /mental difficulties until I became disabled myself.
Stop
I would hope she would go into remission, if not, direct her to a Christian counselor that specializes with her condition & be available for her until the end.
Happy
Fine
good, but still worried about the next night for her and her child
So make me feel good that they feel she feels good that she’s got food to cook for her family
I will feel some type of way
Wonderful
Sad
How can I be of use?
So happy!!
pretty good
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX8fwxRO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDiJNeUColtbqv23lV-F6SbKlhgfLAkH-2xV4KIwVHyiQ&oe=657605CB
Real Terrible
Very excited about me telling them about my adventures and proud
Tuck them in bed with her and she sleep in bed with them on top of cover don’t sleep hard and wake up doing the night
I am already supporting such a group.🥰
I would be very happy to have helped.
I am a pastor of Christian faith Ministry and we have food outreach and much more
Very happy
Amazing
Wonderful
Sad
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX8oPAm3&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB3MOOiPss0ElRD10iH9Dc6_sHnUbJTv5Sd5si5wGbtPA&oe=657605CB
Make me feel at peace with myself that I helped someone in need bc I’m how it is to b in a shelter and just one person who will bless you with warmth and a safe place is such a blessing and it warms my heart
Very happy!
Great, especially since I already donate to the NRDA monthly.
I would feel blessed and know that
https://cdn.fbsbx.com/v/t59.2708-21/364208135_261183633338001_6854460817308457234_n.gif?_nc_cat=1&ccb=1-7&_nc_sid=cf94fc&_nc_ohc=W-yf_jt7kFoAX-gBLCU&_nc_ht=cdn.fbsbx.com&oh=03_AdSAE0CxSfXEXXKpkxj0RfnqpTBEu_GCxS25N7PVtzg-0g&oe=657397A6
That this shelter is placed here by loving, caring people who want to help her & the child be protected from the harms of the outside world and a roof over their heads
I would tell him that it made me feel good that I was making a difference for them and your future
Happy
I’m def in support of charter schools and parents having the option and opportunity to choose the best education for their children whether it is charter, home schooling, college or vocational school
I would imagine they would say, Thank you so much’ and I would want to cry
I’d be so glad that I could help someone
Awesome
8 d9nt know
Wonder ful
I would be sad I would then ask them if it was ok if I prayed for them an with them then I would pray
Happy
Well good but I don’t know what I can do cause I am disable and at this time I need food also
That I help another person achieve their goals and that I am proud of the outcome of the work that was done
Relived
Thank you and good inside to help that person. I would thank God for making everything possible that’s my answer thanks
Like a million dollars
It would make me feel better to have helped
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX99xARx&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfDJXwZUzYEFss_pOiMGosbIqgrcPbPAdFov3CbxZw2FVg&oe=6578000B
I be Happy to help her
I love helping an individual personally –I feel it is what God would want me to do so, I make up Blessing Bags to giv e to homless people standing and begging on the streets..the bags contain snacks, gloves, socks and money….
Great
Happy
Very Happy
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX-X-Klb&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfCpDFHCDY1ruVbmKi22UtazqOhkYQ24A05SegmJoTQ4jw&oe=6578000B
It would feel great
I would feel very proud that I did all I could to help him and any others with him I M also want to help Veterans in need
I am 62 years old and I think about that often with my animals if something would happen so it’s due to my heart and close to my situation. Foster care is definitely an option. I would love to take into look into. I’ve been thinking about it for a while, I just keep praying and hoping that God will lead the way
Good
This would make me happy that I was able to help someone
Good
Glad
Proud happy
Stop 🛑
How would this make you feel
I’m in that predicament now due to something out of my control
Wondfu l
It would make me so happy 😊 that I was able to help someone.
This would make me feel amazing knowing that they are learning something that will be prosperous and they are putting the effort in.
Yes
I don’t know what to say
I feel bad about police officer who loves to harassment black young person or people
I’d feel great helping somone
I don’t
Very good
OMG I would feel so blessed to help someone like that
It would make me feel great!
So good inside. And so very proud of myself. And thankful that I am able to give.
Not interested thank you.
Wonderful
I would feel honored to have helped make treatment possible
No
Happy
Very sad.
I mean, I would feel gratified. I helped someone out when they needed it, and instead of using the money for housing, they could use it for food and other necessities.
Great,
Horrible
LOVE IT
Hopefully they would say thank you for making my world cleaner. I would say it is my gift to all of your generation. And to the animals who had no say in the matter.
Very proud
Awesome
I would be thrilled that Lucy got a new loving home.
Unsure they would be thankful. Same way someone receiving an organ transplant would feel
I just want to know the man I I met a month ago does he love me or was he just gaming me that’s all I need to know to go out with my life
‘I’ was that woman… 2 different times. The first time was with my first 2 children. WE struggled, we saved we did without things, but never was hungry. Then….11 years later two (2) more children..same thing, same problems and someone always helping us, me as a mother…. Growing up my mother would ’hall us up to our local Salvation Army and we (5 of us kids) would prepare food trays. We LOVED it, WE respected it and we never, ever turned our noses up… THAT made us WHO WE ARE! Never knowing one day I would be the one that’s stood in line… Thank you and I was to help! Lead us…,
I’ve been homeless. So knowing that anyone is homeless just breaks my heart. It just should not be happening in this day and age.
It would make me feel wonderful that I was able to help.
Happy
would feel satisfied
Like I was helping people and animals
thankyou
Wow! My ancestor stood up when needed!
Pleased, relieved, happy
One more accomplishment for humanity
Its good to hear the responsible of Everone
Yes I have stage 2 breast cancer
I already donate regularly to NRDC!
i have a gun and know how to used it
Wonderful
Yeah I’d be honored to impress my grandchildren and help the world at the same time
Id feel good
They would say thank you
I would be very happy and thankful that God has given me the opportunity to help
It would make me feel great that I could help her as it has happened to me and it’s not fun living with out roofing and not knowing Day after day what would happen to me every one ñeeds a chance to sleep safe feel safe
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX-zZ_qd&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDQ0gF3uor68qy_G_2xCsklLTgq1e1XQdoBvLKRphVvOA&oe=6578000B
Good
Happy
Happy
good
https://cdn.fbsbx.com/v/t59.3654-21/408171501_894064962305232_278759541567395800_n.mp4/audioclip-1702120529000-2438.mp4?_nc_cat=107&ccb=1-7&_nc_sid=d61c36&_nc_ohc=eMyVJSgaGS8AX8Zp-ja&_nc_ht=cdn.fbsbx.com&oh=03_AdQ-iGF4F0bLl7IoAt_Y_-muUqFdOC1kj2ZzsyaXNQdIuw&oe=6575AF8F
Somewhere to sleep
Happy
I’d make them feel that they çan still do anything
Great
It would make me feel I made a difference and saved another life.
You’re more than welcome. I am glad I can help you.
Keepgoing I’d have to say
Would make me feel good for helping someone because I kno the feeling it’s not nice
I already sponsor both economically and volunteer hours refugees through The Episcopal church and our local Interfaith Ministries of Greater Houston. I don’t know about HAIS but will check into it.
WOULD YOU LIKE TO ADOPT
Are you saying tell someone about this healthcare plan
That would make me feel so wonderful.
Feel glad I could have helped
Good
satisfied
Good inside
I’d be happy to see if it works.
Absolutely Happy! Also proud of myself.
I would be the one person for saving my fathers life if this happened to me.
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_qiiA-&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfCYCozrLjKnn-SdSw6xagWOOaqkoxmQIhJIIJ1uv8bJbQ&oe=6579FA4B
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX9sD0h1&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAw6gA8e75vBMjZyOZoLkieOBFkXBDoyqSTFYqlhuGvHQ&oe=6579FA4B
Happy
Happy
I am a 3 time cancer survivor. My sister-in-law is fighting throat cancer and they can’t do anymore for her. This is devastating. I wish I had the money and knowledge to find a cure for people like her.
I don’t code, what else is available locally to assist one to one
Well, something that we in the first world countries I guess you could call him or take for granted our lifesavers to the third and fourth world countries and I can understand them being invigorated and happy and Jo Anne ready to learn and oh that would make me very happy becauseI like nothing else to see somebody be happy and content with their present situation, then somebody that struggling and fighting the world if you know what I mean
like I made a lasting difference.
Humble
Already have a into the house
thankful for the opportunity
I would feel good
I would feel like I followed the purpose of life, to help others.
Bad
I would feel the need to say this is the greatest thing ever to happen in this world right now and I get to see it all
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX8mENn7&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDEIvcZjsYdZVYmD7Sc1A85oERH1cqaSoBpXftG6s51eQ&oe=6579FA4B
I do rescue work with cats at a local humane society
Icanlive with children getting clean water and being healty
It would be ok
Happy
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX-x-VgO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB4Sjydptyc68bLpGqHGKN_-c5biFXIujzTUElDqJ3_Qg&oe=657BF48B
That would be me
I would feel 👌
Look this baby needs love like she or he has always known can you please tell me that you can do the true love ?
I’d feel great.
Not now
Good but I’m too old
Awesome
I would be happy.
I would love to see our family and friends get a good picture
It would make me feel very happy that she and her child were safe and warm. Then I would 😁 smile!
She might say, “Thank you.” I would say that I was just being a good neighbor. I wanted her and her child to feel safer, sleep better, get some respect and resources, and have breakfast. I would want her to know there was hope, and I cared. If she was a Christian, I would pray with her. Otherwise, I would wish her well, and pray later for her, on my own. I would feel grateful and happy that I could help.
Thank yoy for helping. We appreciate it.
Im not really sure what to think about it.
Re do
I imagine they would thank me for the sweet dog or, cat
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX8xYXOE&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD7XI4upF2MSfSTdAGLkl85TGuZZEtkQ87-MK3JV1nnqA&oe=657DEECB
The young lady would thank me and I would be so proud and also happy
How about helping the sick that is rigt on top with this
I don’t know
Wonderful
No thanks
Happy and fulfilled
I would try to help; IF I could. My own concerns would come first, though,as I have my own furbaby to care for & I am hoping I outlive her because of the way some people neglect their animals.
Great
https://temu.com/s/q4XhXMMEbwylF3
Fantastic
Out
Helpful
Good
Very. Very. Conserva. About it
I would feel so proud of myself for helping bringing a school of education to the neighborhood 💯
It would make me feel like I’m helping someone survive. It would feel good.
They would say, ““thank you,”” and I would be so glad.
I have charities that I give to each year. Please take me off your list. Thank you and be blessed. 🙏
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX8icmLs&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBa6UCJRwF_R_sb40envceZNrmRZkUdzdtlrCW2UuJJzA&oe=657BF48B
Good
Proud
I can imagine saying why did we come 2000 miles to pick up trash?
very happy
Good
I would feel a little bit relieved because I was able to help a person who needed most my help
Useful
Are these questions going to lead me to donate something right now.
God Bless you and be safe
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX-0MKRo&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfASOxZIELLaD7x-TClIgnuURlrI52fVyXitF4yAktLg1w&oe=657BF48B
good
It would make me feel real good. Knowing that this animal had a new and loving home instead of being enthused.
?
I am the one that needs to know how to pay my rent
Sounds good
Bad
Awesome
I WOULD BE HONERD .I WOULD BE PROUD TO BE PART OF SUCH A GAMECHANGEING RESPONSE ABILITY
I am the helper of Almighty Shiva.
I would be hurt due to the fact that I was trying to help someone who didn’t appreciate it
good
I thank God for you or I think Jesus for sending you too help me in my time of need
I would tell them about those who inspired me to protect and work for an environment that will sustain many generations into the future.
Inadequate
OK
It would please me a great deal especially if I could help her learn to teach someone else to feed their family
I would love to be able to do this as I just had surgery a few months ago and had complications but I am home and on the mend.❤️‍🩹
I would feel that ““at least made the start of a difference”” and ““where do I go next””
So happy I’d cry
I’d feel great
I know they would say ““thank you””
bye
Heartbroken
Thanks
Nice good
Good
Gratifying
I’m.ready.for.the.quiz
Relieved they are safe.
Make the bike a reality
Great
I would feel that i have accomplished my goal
I would not have the money to help you but if I did I would help him if I could I would try to help him
How do I donate
Honored
I would feel great bc I fed someone!
Awesome !
It would be like reliving my own love of reading.
us
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_p5_DU&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfBhHfhZ1rfZgltU7MxePV8tnVNZPDxabd0snFJU-28nrQ&oe=657BF48B
Happy, proud that I could help in my small way.
I havs spoken with low income students & would see they need to further education without a financial burden. I now live in Tennessee & we have a program that pays tuition for college education I imagine they would be relieved somewhat & more so eager to jump on Training for a better chance in Life. I sure Thank God & st. & our Gov for all kids born here to have this opportunity. If this what you call charity so be it…
Pleased that God was using me as a tool for His good
I would love it,a sense of accomplishment but that’s just 1.save them all!
please stop
Good
yea
happy
I would be happy that they could eat, but sad if I could only provide a few meals.
Dreadful.
That’s great
Validated
Feel so happy because l was able to help a mother that really needs some one to solve her problem and it is gift from our Lord
Don’t know
Thanks for the tip! I was just trying to find a beneficiary since I probably won’t be alive too much longer. I’ll look into this Housing Matters group, never heard of them before.
Great
Proud that I played a part in such a major benefit to humanity. But there are so many problems affecting humans and animals and I want to help them all!
Awesome
Bad
overly thankful
We need zohelptheo crananimals
Very warm inside
Great
So helpful
Feel better too helpthen
Want to take care of this person
I wouldn’t want them to know it was me.
Thank u grandmom
Depends on what they say
Although I have not faced anything this frightening, I have gone through some incredibly difficult times and seasons and was so grateful for family and friends
So impressed, very imotional enough to remember it!! I was a teacher for 30 years
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX-VfC5c&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBe92fQ6HIJa0kvLae2zryojUzJPw4wmjmNeU5hmi4xKw&oe=657BF48B
Wow
Happy
Awsome
Fulfilled
I already participated in my granddaughter s games.
Very happy 😁
Make me.fill great
I don’t understand
I would be so over welmed and feel good inside this family is warm in a bed with clean clothes and beddingandafull belly.

I was a pre school teacher

The same identity
It would make me feel soooo good!!! I have been through so much in my life! I have been physically, emotionally and mentally abused!!! And left without a home and money….
Best person every that would be glad and happy to help in which ever way possible as long as I can and they allow me to help change things in a better way
i WOULD BE BLESSED THAT I COULD BE A BLESSING TO HER AND HER CHILD.
Awsome
It would make me feel good
They would cry and it would make me feel so good to help
Very good
I would want to be annomised
I’m sure they would say thank me and it would make me feel blessed
BLESSED
Communication is the Key as well as coming to a conclusion on things some of the questions that I answered all of the have an explanation behind the question
I would just say that the cow is nursing her babies to make it healthy so it sharing her milk with you then make you healthy
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_CG672&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBXvgcynAZqvIVOUpR6zltHZnSNOrR89D5pHdVAu7hHrQ&oe=657DEECB
I would love to know what they would say to me
I’d feel proud that I was able to help the wolf animals
I would feel enormous gratitude.
I would feel grateful that I was able to contributing to the survival of animals that might otherwise become extinct.
Great
Grateful
Wish someone would do that for me!
I would feel great.
Inspired
Need the address to mail fonation
GOOD
This. Is. Not. Mine oroscopo
Great
Could be any number of things.
I have been sending money to GreenPeace monthly for years. Maybe I will change my donation to CLear Air Action.
Ok
Terrible
there smiles and big full bellys would say it all 😘😘
Blessed
That is wonderful, but you should support locsl
Happy that they were able to settle into a warm home.
Wow
it would make me angry that his health insurance wouldn’t cover an injury he sustained on the job. but happy that i could help.
Unsubscribe!
I’d be trying so hard not to cry from joy at seeing that young man being so happy and free to be himself at last.
Wow! It takes a village & we can do hard things if we work together!
They said thank you…felt like I’d made a difference
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX-RnjDX&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfDUp72VEHQKpJSUojiIVAjlDXVNikowMiRowdckKn4uXw&oe=657DEECB
if I could accomplish this goal, I would want to accomplish even more in helping to heal those in need of healing
To make a better safer place to live
Good
Living safely and free is good for all wild animals.
And also I would look into this for myself and my friends
Thank you Lord for all you do both night and day. You help the sick and shut in the physicallyand mentally challenged each and everyone and for those who disagrees and feels you don’t do enough forgivethe Lord they don’t understand that while it seems your neglecting.people you’ve are actually preparing them for the. Blessings you have prepared for them
That would be great
Stop
GREAT
Good night to you all
Need to know more
Great
Might thank me and I would feel great to be able to help someone
If my children thought that this works would be a good place for their children then I would be a grandmother, but as a result of this dream not coming true I will not have the opportunity to do so as they’ve chosen not to bring children into our ugly world and I understand and sorry them and their decisions.
I would feel great
Very grateful
It would be an improvement
It would make me feel very happy
Aw
Not sure
I would rather get their own private homes shelters are not safe antmore
excellent
id try to help as much as possible
Happy
OK
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX_Q-7VT&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDafIu1dW2DGOEahbD7LYzVRcCijjcQNvra0VFa6cErRw&oe=657FE90B
Since I was once homeless myself, I know how hopeless you feel in this situation. I can make suggestions on where she can go and who she contact to receive transional housing to have time to breathe and be safe, until she can gain employment which would lead to permanent housing for herself and her child.
I m a cancer survivor I know we can win
Humbled
Special to be able to help this boy out
very happy that this person feels accepted
If I can help anyone because that person is someone’s son or daughter that are in need
good
I would feel very lucky
I’d feel good because I am a giver!
What I’d really like to do … two different things. ** I’d like to photograph dogs and cats who are looking for new homes, helping them to put their best paw forward. ** the other thing I’d love to do is help puppies and kittens get used to be around people. And if they’re really young, to help bottle feed them until they’re pld enough to eat puppy/kitten food If I could do any of these, I’d feel I had purpose in my life.
Happy
Well poeple would help each other to get settled in .
I would feel honored. I really wanted a suicide prevention charity.
Thankful
We can only hope
Super good
i would feel greatfful that god chose me to help them and all id ask from them is to pay it forward when their circumstances improve and are able to do so.
Very bad
It would make me angry and sad at the same time
I was hoping to get a charity that was more aligned with my interests
https://cdn.fbsbx.com/v/t59.3654-21/410381031_336816302423428_5504261149107230163_n.mp4/audioclip-1702525225000-7059.mp4?_nc_cat=107&ccb=1-7&_nc_sid=d61c36&_nc_ohc=QVfLRV9No7wAX83FJsQ&_nc_ht=cdn.fbsbx.com&oh=03_AdRtvNvZE3m73CkzBO0u3_J-Y9hFh9luaJ4xfbPqdIeKhA&oe=657BE5BE
I would feel wonderful
Great!
I wasn’t sure how to answer. Although I support saving the rainforest, it’s not my passion. So I was kind of disappointed with that choice.
How much is this going to cost me now your answer will dictate how I’ll feel
No one won’t suffer
Good
I am so happy that you are feeling better. You can go on with life now that you have received that treatment. I am so happy that I funded this treatment.
Sad
Appreciated
https://cdn.fbsbx.com/v/t59.3654-21/409594335_339587722148100_3227941336017767688_n.mp4/audioclip-1702601380000-11076.mp4?_nc_cat=111&ccb=1-7&_nc_sid=d61c36&_nc_ohc=aC1I0_Htjh4AX-mq_R3&_nc_ht=cdn.fbsbx.com&oh=03_AdSgt1XKhUki3ehl8VBQesI6Kn0MxKLfkVQ69svCjOPBmQ&oe=657D7742
It’s not about me and as long as I can help them I will be trying

How very, very grateful that Lucy will be taken care off when she passes.

It would make me feel so warm and happy to know that this sweet lady can transition knowing her precious Lucy will be well cared for, and not “another statistic.”

I love helping people, and I so very much love dogs and cats. I just get so sad when I see stray dogs.
Good
I hope I was of some help. God bless you, and thanks so much for your sacrifice
By the time I have grandchildren I will be dead my daughter’s only 5 years old I am 65
Wow
Let them have it
Great
Maybe like I helped someone make a better life for themselves
I don’t have the money I knew it was a catch .but I do thank u for the reading
No
I would feel great .my son wants to be a computer programmer he is in early college getting into computer science so someday he can make his own games
It would make me feel great knowing that I helped in some little way
Very good knowing I had done something to help others
I’m opting out
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX_sh0vV&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCJ8LuHr3YY124upe1N1vxZiE0trl-vtEIK3K2AjwbMIw&oe=657FE90B
Wonderful
The look of thanks in a Mother’s eyes as her child improves is all the The thanks I need or want.. Gratitude is the Attitude..
They would feel a lot better knowing someone else cares to help
Very good
They be great full
Good
I have a way to help I’ll help
Awesome
I am a old women that has a dog
Blessed
happy and heartbroken at the same time🥲
I would feel good knowing that the fur baby was took and love after. Every body needs love and care for. But animals need to be care And love to. Because animals are God’s little creatures. And they need love and care about.❤️. You see I got my little fun baby for the pound . Her last owner put a Chain around her neck and put her outside in the Cold Months of Dublin Ga. But I got her now . When I open the gate at the pound she jumped into my arms. She was 11/2 then she 6 now She is well love really she SPOILED Rotter
I would do anything I could possibly
Worm and knowing that I have been there someone when no one else would to see that they won’t be on the streets
iwould feel blessed to have the opportunity to help them with a solution to their needs
I feel overwhelmed that I can participate of helping someone that’s going through the tough times of cancer and battling the outcome to be supported with them through thick and thin the rest
Ok
I was dairy pleased that he was able to return to his old cell. I know I probably shouldn’t of started this because he probably think I’m young age and I am not I am 80 but I have so many losses to heart attack. It just makes me sad I would give anything if I was a smart enough to do this, but I thank you for talking to me. It was wonderful getting to know different things. Thank you so much always Betty.
I would ask mom if I could help her cook dinner.
It would make me feel like I made a difference in a positive way.
Good n somewhat worried
Useful, fulfilled.
Dont know
Elated
Happy!
Good
He should have health insurance before going in for duty
I can’t imagine helping him
I would feel better knowing they had a safe place to at least lay down to sleep in peace and feel safe
Cool
Id be upset
Motivated to make sure she gets 5 more books, has access to a library, and support at home to encourage reading more
Good
I would NOT want praise! It prefer giving secretly
Please remove me from your contact list..donor contact me again Thank you jean woolman
Mad
Amazing and an overwhelming warmth and happiness within my soul!!!!
That I needed to do more
I’m the person that needs the help
I would feel good inside
Very good
I would feel very good
Happy
I would fell good and happy for her
I’m not here for that
Good 👍
Awesome
I would not place Lucy no where
Really good!
Incredible, as I’m a cancer survivor
It would be perfect
I don’t no
Don’t know
They would probably appreciate it a lot and Thank me, I would feel wonderful that I could help doing God’s work. A Blessing
Very good
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX8flAz1&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAej1r7vLKl8gwm_emE4na89Si7DmZeip9hxRfLiC2jDA&oe=6581E34B
https://cdn.fbsbx.com/v/t59.3654-21/410804794_1522895131584831_8646873821215929121_n.mp4/audioclip-1702664997000-9172.mp4?_nc_cat=100&ccb=1-7&_nc_sid=d61c36&_nc_ohc=SEzbp3bFV-UAX8FnuJV&_nc_ht=cdn.fbsbx.com&oh=03_AdSNypQDuhphei4NwV0zWTrDUFxPczcpQe1zQAx_KHqVeg&oe=657E51A9
I would be thankful that I succeeded in helping someone have a better life i guess i don’t know
Go away
I would feel… Grateful. Unworthy.
Confused. I haven’t spoken to a child in years.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX9mVPNu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDxX3DkcBQk609I-oUC-e11jlzZ9TMQxsgHyCa1p-3w-Q&oe=6581E34B
goof
I don’t have grandchildren - this is a painful spot for me - but I can imagine feeling good about the scenario
I wouldn’t need him to say anything. Just knowing I helped is enough.
it make me feel good because I will be helping other people 1
My grandchildren are clueless. I do this for my own sense of right
It would make me feel great!
No thanks
Fulfilled
proud and gratified
Great
I would be glad that they had this help and hope that they could continue to get what they really needed.
Great
Redo
It makes me feel great.Im interested in helping in paying bills for the people that’s in poverty.
Cancel
I would be pleased knowing he received the proper care.
I would be very glad thatI could help her feed her family! And would appreciate a thank you from her. That would be enough and that she greatly appreciate the food! I would feel good inside that Zi could do that for some one need! I used to help my neighbor man . And bring food over to him and he was not of good health! I know he appreciated it!
Child might ask why this is important. Answer: because polluting water means a great many people are affected. Bad water can bring disease.
Ok
Don’t know yet
Perfact well done amigo
Said
THANK YOU
Humm
I would feel Happy the animal has a good home
That I’d made a real difference
I would feel really good that I could help a child out
https://cdn.fbsbx.com/v/t59.3654-21/410901688_394614582981671_6358871435143137147_n.mp4/audioclip-1702705985000-195373.mp4?_nc_cat=110&ccb=1-7&_nc_sid=d61c36&_nc_ohc=D2tgNRm0BZcAX-tPFxV&_nc_ht=cdn.fbsbx.com&oh=03_AdQhfZhdhyVyusTDlv4hmiIAYZm5HXPXf3_0XGjxO-gpbg&oe=657F2823
I would go to Disneyland
Again. Not sure. Sorta ill @ this time. Thought process is not working well
Like I accomplished something
I would be very happy and proud that l help someone.get better and to live longer
It would make me so proud because he would be able to feed his family and others who needed help!
Yes
Victorious
It will make me feel good if I’m able to support and help her help with the situation
I would feel that everyone was finally safe
GOOD
I’m always responsive to people in need I am a leader n have put numerous amounts of people ro work over the years
I would like to see the world with less trash in the ocean last mining in the Earth and less commercial fishing in the sea everything should be localized and there’s too many things going wrong with ordering we need to change the Earth to more like it was before hit is almost destroyed we’re like a bunch of termites and a piece of wood what’s the woods gone we got to go somewhere else and the Earth is a big organism we’re like fleas we’re on our dog and and if something don’t happen the fleas will tear that dog down kill it so we need to change a lot of my ways cuz I’m a American Indian and we only took for Mother Nature what he gave to us thank you and I enjoyed this
Relived to give warmth shelter, and safety to a family. Satisfaction.
I don’t want to talk about it anymore. At work right now
helpful
Useful, blessed
Grateful for being able to help
Thankfu
awesome
great
ok is this over now
Incredible
Good
Blessed
Very good
It would make Me extremely Happy To see Someone succeed
Xxx
unsubscribe
happy they aren’t hungry
Good luck
Ever one need to how to read
I clicked on 🔗🖇️
I will feel better because God got my back
like i’ve earned my place on the planet <3
FANTASTIC
Great!
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX-dP5B5&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDfSMVN1PXWM8BQRtOmaqQwzI4Pz6KDh3E7DacVPAjjAA&oe=6583DD8B
Not anomous
People has there own opinion and I stated mine .
Nice and worth cause
I would tell tell My grand baby That i help that Animal
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX9_Ge87&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCsQ5bNSJsbLTv8ZzHo37hyfQaMHWmrXxcqzANg5-dTVw&oe=6583DD8B
Gr8
It’s all part of my duty. I don’t do it for the praise I do it so they can enjoy it and pass it on
Stop
End
Good
Contented and joyful
Great
I worked with the poverty program many years ago. Many of the teems I worked with could not read at the third grade level. This seems too simplistic.
Proud and humbled to have made a difference in someones life
Worried
Happy
Warm
What the dog & cats would say? Or a person
Very good
Very grand
Very much
I was that woman
Really good
Go away
Badly
Helpful and good for them good
HUMBLY GREATFUL TO HELP
I actually don’t know
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX90Oj2Z&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCxBceOdI_KYwg8HRCj-swNi0_6IxBblD6Qi0kET0eAzA&oe=6583DD8B
That would make me feel fantastic Knowing that Lucky has a new home and is being well taken care of
Good
Actually, a close friend works for Habitat for Humanity in our hometown, so I’d probably contribute to them instead.
Stop
I’m done thank you
Sad
Great!
I’m not sure
Wondeful
Horrible
I am good with it
As long they are comfortable.
Humbled
Like I’d done something good
Bad
I would feel good about get her dog to a good home
Great
I would be quite happy, & humbled .
That makes me feel great
This is so me. For years I have dreamed of opening a shelter. Not just a regular shelter but 1 that would provide job help, would help a person get on their feet. One where the person could work and have child care on the premises and they wouldn’t just have a cot to sleep on, but their own living quarters. I would also have a separate area for those just looking for a place to sleep. Plus more
Very, very happy!
I was fine filling in the survey but stop harassing me to type out a free text answer
Blessed
Good
I would help her and make her feel comfortable
Good
Wonderful
It would make me happy
Like I was making the world a little brighter
I would go for a another treatment center,
thank you
Great and happy
good
Hopefully they’d be grateful, and I’d be happy I made a difference
Sat down and cried
Probably negotiate but accept if hard to
I’d be proud of myself I help someone like it still have a life
Assimiong she said positive things, I woulf lovr it. I’d feel great.
I think they would be happy that I’m helping people.
that would make me feel good knowing that they were safe and feed
Ok
Happy
Well I would feel awesome to be there to help a child with it’s mother that’s what my ❤️ would do and it’s the right thing
I would feel relief that we are safe from the dabger
Stop
I WOULD TELL THEN NO ONE ESPECIALLY CHILDREN DESERVE TO GO HUNGRY BCOS WHEN GOD CREATED THE WORLD HE MADE ENOUGH FOOD TO KEEP EVERY ONE FED NO MATTER WHAT HE FEELS ABOUT HE FEELS THAT HE CREATED IN HIS IMAGE AND LIKENESS WHICH IS LOVE ABOVE ALL THINGS
Blessed
Amazing
I imagine that they would say thank you for helping to fund my treatment. I would be very happy with a thank you
https://cdn.fbsbx.com/v/t59.3654-21/411853185_1324926681492653_9030273789224396072_n.mp4/audioclip-1702868172000-20502.mp4?_nc_cat=107&ccb=1-7&_nc_sid=d61c36&_nc_ohc=ngwjdiRyVIIAX-xJ0q4&_nc_ht=cdn.fbsbx.com&oh=03_AdTmV_s9aLLdKxsz3ykNpAap__CiFPJ_BF4mG9vqUow2GA&oe=65818341
VERY PROUD
Well first of all my heart would hurt just because Lucy is going to miss her best friend. I would be worried that she might give up too. However we have to move on. But it would be my honor to make sure she finds her new forever home that would feel like they’re the luck ones to have lucy. I would want Lucy to know that she is like royalty. She’s been through enough and should be known how lucky her new family is to have her.
https://cdn.fbsbx.com/v/t59.2708-21/271391393_285833123577164_3019058740671391760_n.gif?_nc_cat=1&ccb=1-7&_nc_sid=cf94fc&_nc_ohc=-5JEOP_QD9wAX-D1Hbn&_nc_ht=cdn.fbsbx.com&oh=03_AdSpXJbYBzmgDO3hEolOCSt5paJSfA7uDRl7hF8IC_B3Iw&oe=658143FF
Hopeful for her and her family
STOP
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX-C4eyk&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBXTaXu4I4-atxSAnHYVW_8F73b__OqW5hvL9-NOb6mbw&oe=6585D7CB
Happy
Gratified in my being there to help plentish the need for food!
She might say I hope my clinical trials on me wiil help others live maybe help them have a better life than me. Sad that there’s nothing to be done for But her volunteering for clinical trials she’s proud that she can help others after her
I fucking love that! :0 Rainforests are grossly deforested quite a lot. :0 I’d love to give back any way I can. :>
https://scontent.xx.fbcdn.net/v/t39.1997-6/375594611_266105642898861_5403976904196268316_n.webp?stp=dst-png_p100x100&_nc_cat=100&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=ogiEIQNxveEAX_O3U-S&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCI7zJB-hMkytjO1uOpllNFIe0TPaWSxa3rRd5NYNOdEw&oe=658448DC
I don’t want the recognition
It would make me feel really good knowing that she was going to have a good meal there’s not a better feeling then helping people in need
It would make me feel better about myself
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX9PWBgr&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBXwQF45qS0B8Kra5MVXklvLTDV3BB9elaFW9OC2k3Xfg&oe=6585D7CB
Good
It would make me feel good knowing that another person and her kids are in a safe place, we should have more shelters for the homeless.⁰
I would feel extremely happy to play a part in improving education to the needy
The children would love it and so will the parents and me knowing that I have helped someone
I would be filled with joy
I’ve already done this with my children!
That would be great, but sm more interested in prevention.
I would feel bad!
Happy
So glad you found a new home. Would you like help finding support in your new neighborhood?
Jjn
ok this is getting alittle over the top now
Excited
That wound be nice
Thank you.
Thank you.
Helpful & fulfilled
Very good inside knowing I helped someone
That would be totally awesome :)
Feel Good
I will cremate her and take with me
Positive
Pretty good
It would make me feel good that I assisted.
I would do what I can. Coming from my heart
Wonderful I want to help end animal cruelty and save all the animals
relieved
They may ask about this period of time and wonder why we didn’t listen to scientists. I would feel frustrated
Warm and fuzzy
Happy
.
Glad
Thank you and God Bless you
Awesome
I have a dog I would love to have someone to take care of her
STOP contacting me
Good, but I don’t want to give just money.
I would feel happy for the women.
good I guess
I would feel good, but I would do it even without the appreciation
Start over
i would feel very good and accomplished
Happy feeling like I mattered
It will me sad and I would want to help her
Awsome
5i wnt to people in need, especially family
I already know. I volunteer with a homeless organization
STOP
Sad. I want real housing for the homeless, not temporary shelters.
Out of control of the follow through.
It would make me feel awesome
Wonderful
Ok
STOP
It would make me feel happy
It is not clear to me who ““they”” is in ‘imagine what they might say to you.’ Assuming they is the young activist, I would feel like I had not done enough.
Not the right match

The well-being of wild animals is important to me, but a higher priority is nonhuman animals who are being actively and systematically imprisoned, tortured and killed by humans.

You did not make the correct match, Charity Navigator AI.
This is magical, as I have been a monthly supporter of the ASPCA for decades!
Warm and fuzzy; ecstatic, excited, joy in my heart!
STOP
Good
This the world I want for them
Frustrated that we are making individuals pay for healthcare instead of the government and framing it as a feel-good story. If he suffered smoke exposure on the job, serving his community, and can’t afford healthcare that’s a major problem. The story makes me angry and we need solutions, not jsut community funds, though those are important in the short term.
Pleased to do it
Sad
Thank you
Response
Thank you so much, you not only helped me but my family too.
Good
Blessed to know that someone was eating
Very proud show my grandchildren how pay forward.
Ah ha! A scam! My Cousin told me to open it since he works for the Federal Cybersecurity commission. Don’t bother trying to to reach me back—he has your identity and figures youre trying to exploit the elderly like the scams. BTW you’ve been reported and won’t appreciate the outcome
I would only hope they say thank you.
I would feel very happy that I was able to assist this young man and his friends, because I not only helped the young man find his friends, I helped his friends find him.
Happy
I think that is awesome
Probably that my back hurts.
Not sure
Thank you
Great
It would feel amazing to know I had been instrumental in helping to save the environment.
Glad they are safe
Good
This is not the right charity for me. I am more interested in disability justice and representation.
Makes me feel happy and fulfilled
Great
Very proud
Like I was making a difference in their
goodbye
It would make me feel great
Good
Like I’m living my Faithn
happy
Good if he/she had a plan on next steps
I ain’t want Adam thing out of pe
Really good
My mom is passed away
Well its my experience that children are taken from a parent with no.home so That’s bullshit they would get first .pick in any shelter situation
I’m being a blessing to someone,thank God
Feel very fulfilled
I feel like a made a difference
Good
Very humble
Great
We’re done, thanks! I know everything I need to know!
Blank
Blessed
I’ll stick with St Jude
Wonderful
To be honest I would be very proud of myself and the 1st time I was afraid on how I was rated
💜
I volunteer for NOVA Hope for Haiti. We do that and supply fresh water. Salary only for medical staff and good use of resources.
gratified
Fulfilled
Very good
Sad because it’s temporary
Sorry got to see go now
humbled
extremely thankful to the universe for letting me help someone
Iam very honest so it would not hurt me any
Great
Overwhelmed
fantastic
Happy for them.
It would make me feel awesome. I have been homeless and it’s nice having somewhere to go when you’re at your lowest
Thankful that I could help
Like I said, I will THINK ABOUT IT.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX8lUEEa&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA2RC41iwW-fVIkZvfgo-mDOS-ZN4TEdyUxdAti8isoRQ&oe=6587D20B
happy
Good happy
Inspired
Pretty pleased
Happy and useful.
Very smart 🤓
I would tell her how happy I am she was protected and got some justice.
good
Glad I could be able to help
Blessed
Satisfied
Grateful
Good
Great 👍🏾
You are so welcome. I’m so happy for you that you will get a good educational opportunity.
It would make me feel very good.
Grateful and sad
I have taken my son there
This would make me happy
Humbled
I don’t know if I was a man but I am not
Good
Good bye have a good day
Good
great
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX8Ajb-4&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAPfY5QGPIOeiFl2bggGNwWsvi98VJS2rSxYFibNgZNxA&oe=6587D20B
gratified to help
Awesome
what about rare cancer
Charter schools are rife with mismanagement. Yeah, that tracks.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-0uHKF&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCwR2DL_PWDCoj6KF7DD3n83sBJX0fziupNEoFVFgfJlg&oe=6589CC4B
I am a single mother of two my with no help help from any body please pray for me o need help for please to stay my rent is sky high
happy
Miss YOU! GREAT!😉
great
I would feel happy that I helped someone.
It would make me feel good
Like I made a difference
happy
Like I made a difference, even if just for one.
I developed and directed a post bac certificate program at a local university to train statistical programmers for the pharmaceutical industry and place them in very highly compensated jobs.
Really happy cause I know how it is important to have a pet for comfort and love and they are awsome therapy
We want to be here for you. You are safe here
They were excited to have their own books!
Hard to say because I don’t have children
Blessed
Great, I made a change for people
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX8JXqKw&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBvJfcKDP9J_ZSdi7kvGXASMBK1Fsq-zxiLx3DXITM8QQ&oe=6587D20B
Awesome!
I would feel so happy
Good
Good
Would make me feel good, but I don’t have offspring (on purpose) so no grandchildren for me! 😂
What they might say
They? I thought you said A young woman
I already give to several wonderful charities that help elephants. I saw a vehicle for this charity in Thailand. Thanks for the reminder - I will give to them.
I already do that now. The only difference is that it is the elderly that I help
good
Happy
good
Fearful for them and thankful that i could help but currently i cant. I dont even have a cash credit card
🩷
Pleased
Happy.
It’s not about me but us. Whatever we do or don’t do, the result is based on the laws of thought. God or karma. So we do a deed and it help the God glory is the story or God use us for glory. If the result work out bad then it’s a lesson to blessing if we our lesson.
It would make me happy to help someone else in need
stop
Like I did something important
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX-Enl-Y&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAuRXhK-PoO55F_dAmKbtBfqT_d0RvXuCZ5tgFoKT6CVQ&oe=6589CC4B
No rather not
Of course, I feel good
I dont listen to peoples’ words when i have decided to help
I’d feel like I helped them to find rewarding employment
I would feel embarrassed. I don’t need praise for doing the right thing. I do it because the person I want to be is someone who fights for justice, equity, and reason.
Happy that Lucy will be taken care of…
I am in this position.
Of course I would be glad to hear that I had helped, but I would also wonder why she needed to thank me. Systemic injustice caused her “bad luck,” and systemic injustice caused my “good luck,” so at most we’ve taken a small step to even things out.
👏
I would feel great but would want to follow up with her to make sure she or he was 👌
I be welling to help her and child
Good
Good.
It would make me feel ratified
Good
proud
I would Make eye contact with The mother and tell her that she is at a safe place and not to worry about anything AND to get some rest For tomorrow is a another day
awesome!
It feels wonderful. I spend each Tuesday cooking and feeding the homeless
Glad to help
Thank you would be enough but not even necessary
nutral
Good
STOP
He might say thank you, and I would feel humbled yet happy that I had the privilege of helping them.
good
STOP
Grateful to be of service
Relief
Where is this charity? We began a similar charity in Taunton Ma.
good
Great
Bad
Motivated
Weird, since I don’t have children and don’t plan to, so no grandchildren either . . .
Feeling better
Good
Pretty good.
Releived
been the done that in gatlinburg tenn
Already give to charities
Satisfaction
I have just adopted a shelter dog with the understanding that she will not go back to the shelter if I can no longer care for her
Proud
Good
that’s the goal
thankful
I asked for a US charity and you send me an African one. good bye
Thank you
I’m not so interested in how it makes me feel as how it makes them feel
Good
Happy
I’m hoping the elephants have eternal good health, keeping the environment lush and safe.
STOP
I really do not know
I would feel good.
It would make me feel happy to brighten some one day
It would make me feel accomplished
Fulfilled
Great.
It would make me feel like I am doing what Christ asks of us.
great
I’m glad.
Wonderful
Stop
Wonderful
Gratified
Happy because I was able to help a moth and her child have a warm, safe place to stay instead of them being in the streets.
Emotional
Happy
Thanks
Effective
Sad
Awesome!
They say Thanks for showing me the way. I say I say you’re welcome.
It would make me happy and hopeful!
Good!
Connected
https://scontent.xx.fbcdn.net/v/t39.1997-6/413985330_1810303966061523_5545819025172939798_n.webp?stp=dst-png_p100x100&_nc_cat=108&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=VYIzhVTc3pIAX8v3tkX&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfALHqq-ksZn_QUiQkcDRma49J-TeERvAlm7ERGK-7Nwmg&oe=65895077
Relieved and grateful
Hopeful
I’d be relieved that we actually succeeded
Like my time here wasn’t wasted!
Idk
Put a smile on my face
Satisfying
I feel so happy about this. I’ve got a reason else for no no and educational. Keep up the good work.
Ok
Great!
Hopeful for their future
Awesome
Useful
I know how important this is to you knowing Lucy will be ok and you can rest easy.
No
Eager to do more
-Relieved
Good
Very, very GOOD.
Wonderful
Hi I’m 8 years old
Okay. A feeling well done.
Always good which is why I have supported and benefitted from for years
Honored
Wonderful
Good
Thankful that I was able to help make the world less scary for her and her child
Proud
Awesome!! My whole family knows how I am about all animals
humbled
Good
. Like I wish we had a h
Good
It makes me feel like doing the work of GOD
Relieved
Pretty good
Encouraged, hopeful!
I hope that in future generations there is more compassion for the animals in the food chain. They feel pain, fear, suffer at the hands of humans. I don’t eat meat and wish others didn’t as well.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-SJ53i&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBygr1bb8FmX_iX49QsF8xlFeDIE7JF3YOVsXJrD4n5-A&oe=658BC68B
Absolutely wonderful and thankful.
I’ve been an educator for forty years and have seen its power. I love helping kids meet their goals.
good
Warm inside.
Sounds good, but more interested in other geographic areas
Feeling like I’m doing this to help with those who are truly in need.
Grateful and humbled
good
I would feel love as a follower of Christ.
Like from so far away I helped their world be a tiny bit brighter.
Sad
Happy to have contributed to making a positive difference in someone’s life
This would make me feel very good, knowing I helped provide for a mom and her kids.
U mean being like a mentor. I might be interested in even like u said just talking to a student I can relate to that because I grew up in a very poor family of 8 I have five siblings we had lots of love but little money and I was able to go the school of my dreams for my masters degree which was Columbia University in NY
Wonderful
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX91fXDK&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAvBUGTQNvOXJ6zH_qTwA4OjpqDdJwD2wIWDw3OOMYGLQ&oe=658BC68B
satisfied
It would mean alot it is very important that everyone learn at a young age to respect and love and be kind to precious animals they r so innocent in this world
So blessed to have been a blessing.
I was homeless & I went to a shelter that changed me & started me on the path to a normal life addressing all of my issues & I wouldn’t be living even the simple lifestyle of a Grandmother/Mother
It would make me feel helpful.
I am glad progress is being achieved in cancer research
Feels like you’re trying to manipulate me using my feelings. Not my idea of a smart thing to do.
Thanks
No
Sad angry worried a
Amazing
All the feels
I prefer not to continue
Not my vision
That sounds very cool
Blessed
I would feel good cause I love dogs
It would make me feel great
Fulfilled
happy
I’d feel fortunate to be involved with this exchange
It would feel great.
I just did what was right
Good… I’ve heard of them
I feel sad that they can’t afford medical care. I think everyone need health insurance to cover their medical needs.
very good
It would make me feel good knowing I helped someone
It would suck
It would make me feel like I did something helpful and useful toward making this world a better place.
Good
Warm hearted
Terrific
I would make sure she felt at home
It would make me feel amazing to know I help save an animal
Happy
Feel good
It would make me feel like I have made a difference to her life
Not in my skill set
I wanted to end the conversation. Thanks for the information
All warm and fuzzy
Proud
Wonderful!
Amazing
Useful
It would do my heart good
Like I made a difference in her life
Great
Ok. I feel drawn to the ‘unseen’ disabilities like Austin’s
Grateful
Great
Sad
Happy
Good
Sounds like he might have hope instead of depression. Sounds good
https://scontent.xx.fbcdn.net/v/t39.1997-6/412275334_255916190611542_6592606869661796996_n.webp?stp=dst-png_p100x100&_nc_cat=110&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=5htC-dqmSpAAX_rf8V6&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCGc1Oo1NT7z9s249Lt3zQ7yUP261i6gc5JMh_Y7WFjyQ&oe=658AF420
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-ACysV&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAwTN7ic3OoDk7HtXGPwICI7-7LFCQQtBphb2v5WxBPTQ&oe=658BC68B
Humble
happy
Happy
great
Amazing
Ecstatic
I would love to be able to tell this story!
Like I was being helpful.
Happy
Stop
Stop
compassionate
That’s a hard one I do not know on that one I’m caring caring person my heart’s my damn phone so it’s hard to ask on that one
Great
It would make me feel like they would agree and wonder
I will very happy. And I will continue more!
not great; how did we let it get that bad???
Like I’ve helped someone in need
Very nice
Thankful that I could help
i love to see children reading and smiling as they get new books…
Just seeing the smile in there eyes is enough for me God has blessed me so I try to give back to those in need
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX8BKe63&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBVlaJJMMtFBLCFq2WSayeHc0Zj8z92BITLtLNHvceM3A&oe=658BC68B
I will feel great
If had could be able to save my life I would say Aman thank you Jesus
Pleased to help
Love it
I would be happy they have something so basic as safe water! And happy that others will have access too!
Like I made a difference
Heartbreaking!!
It would make me feel very good about myself even more.
Very good
It would make me sooo happy and proud to have contributed.
I should have know this was a b s deal!
Grateful I could help.
Happy because I have been there
Wonderful
Worthy
Peaceful and grateful
great
Another charity please
Proud
Great
happy that I have been able to help
happy
Good
Great
I would rather donate anonymously so as not to embarrass anyone.
grateful
I would feel pleased that I helped in some way that gave her hope for a cure.
It would feel quite awesome
STOP
I’m not sure
STOP
That would be amazing
Ok
I don’t want or need them to be personally grateful to me.
like it did something worthwhile
The lady would be content in knowing Lucy would go on and hopefully be happy to do eo
Hopeful and happy
Awesome
I am alrready sponsoring a young man & putting him through college.
Great
Thankful and crying
Powerful
Pretty good since I don’t have kids.
end conversatoin
Happy
https://cdn.fbsbx.com/v/t59.3654-21/413098555_1341728500559160_6377395458486547316_n.mp4/audioclip-1703381460000-307943.mp4?_nc_cat=107&ccb=1-7&_nc_sid=d61c36&_nc_ohc=OFM8Qa41SpcAX_rfbB9&_nc_ht=cdn.fbsbx.com&oh=03_AdRmZ-4fgcnwjbOZQxvdeasVBBoYbdIhAjHGGrHwc9h6OA&oe=65895BEE
I’d feel like checking whether local rescues and shelters need money and how the money is spent–not that your charity is bad
https://scontent.xx.fbcdn.net/v/t39.1997-6/365437392_1369509380643228_2799362884993075531_n.webp?stp=dst-png_p100x100&_nc_cat=111&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=6OZCvTJZfWIAX8U1S9a&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDgab7GCbK5euwM3YTW7wsI7K9DUTY88FWK9kzw1cbPVw&oe=658C0943
Ecstatic !
I love RIF! I directed a non profit that worked with small groups of K-1 students ( not students already receiving services) to get them to grade level by the end of the year. The program success rate was around 95 % each year.
Very pleased but I wouldn’t be on the river. I worry about animals here in the US
I think it would put there mind at ease knowing they would be taken care of
Don’t care
Those are the kids who get all the breaks
Stop
Relieved and sad. Hoping the dog understands.
Humbled
Sad
Blessed
Very happy
Let’s pray to Jesus for protection!
Happy
https://cdn.fbsbx.com/v/t59.3654-21/412654645_324090900521375_1192623961824125495_n.mp4/audioclip-1703390988000-3971.mp4?_nc_cat=107&ccb=1-7&_nc_sid=d61c36&_nc_ohc=DzCI9MbRyfkAX9gfBEp&_nc_ht=cdn.fbsbx.com&oh=03_AdQt5rkZ5-0Zx3HK3kqqWrHXcLyycHKFxGcPZ1HzjUqHWg&oe=6589901D
No response
Ot would be such a blessing. But I am a brittle Diabetic.I have fought this disease for over 35 years. I have been told if I was the average diabetic I would.nt be here now. But I do all I can do to be the best diabetic I can be.
Like i hlp someone who needed it
Great
good
relieved
Glad I helped
Like I was a mini saviour….
Happy
Good bye
I’d be ecstatic that it was coming to fullfil ment
I would feel very humble to have been able to do this.
Happy
end response
Stop. I don’t want to continue with this. STOP.
Like I helped someone like me when my child was small, and I was alone.
Grateful for their rescue
Stop
Amazing
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-YvV-e&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDkaFRtuRU_3RugvBaN27Eliptif92ZGiVAYIQsyf93wQ&oe=658BC68B
I do not like your agent…. He is a grouch
I would feel happy
good
I am not sure
Great
Very good
Caring
Grateful
Go ahead and do it
happy
Very good
happy I could help
No thanks
N/a
Good and blessed.
Wonderful
Very happy
Thankful for being able to bless
My heart would swell 3x its size.
Wonderful
Happy
Please delete my account and any information I may have shared with you. Merry xmas, and all the best.
Thankful I was able to help improve her life
I’m done with Texting! Thank you, gracias!
CEO MAKES TOO MUCH
Good
No idea
I don’t want to be acknowledged or talk to them. I don’t want to make them feel obligated to say thanks or be embarrassed that they are in need of help. I am homebound myself and often feel like a burden to family, friends so won’t do that to someone else.
I want to pay it forward -PHENOMENAL!
Sad
great
Gratified
Good
They would be amazed, and I would feel grateful to be able to help.
Happy
Good 👍
Like I contributed
That sounds good. I keep dollar bills folded in the visor of my car and for years have passed them out to people who are asking for help. Now 2 of my friends are doing this, too. I feel it is important to give without judgement. This might help me do more.
Good
Fulfilled - like I made a true difference
Sad and concerned that her pet be cared for
Very good.
good
It would make me very happy to know I can make the dog transition to a new owner and a new life
THIS WOULD MAKE ME FEEL HAPPY AND USEFUL AND BLESSED THAT I CAN HELP FEED SO MANY CHILDREN AND WIDOWS .
Validated
happy
Grateful to have the resources to help
useful
it’s only right
This area wouldn’t allow that to happen
Ok
What
Would feel great
Good
i would have no words or not sure how i would feel
stop
Great
It would makd me feel great
🥰🥰
Stop
Not interested
HIAS is supportive of Zionism and refuses to help in Palestine. HIAS is in no way for me, as they are perpetuating that slaughter.
It would make my heart happy and excited. I would probably jump up and down
enough questions
Fantastic
Like I was modeling the behavior I’d like to see in them
Good
Good
Nice. Humbled.
This would make me feel okay
I love you
Very satisfied.
Fulfilled
Happy
Good - but prefer to help children
Ok
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8RPcA8&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCSNbu08FS0HM-9AeaBnlwvBLSL97h_Uk1QS9ah7DgjSw&oe=658DC0CB
Urdu. My. Masng Bangui
Many things… Angry that a service he pays for refused to do what it was intended. Grateful that I was able to help.
As I started out to see a smile on her face that there are people other than family that will look out for your and your childrens best interest
Ok
I don’t donate for praise and would feel uncomfortable.
Happy that I was part of saving it
good
I don’t want to give to any charity with executive collecting huge salaries when there are organizations in my community that are 100% volunteer.
I’m through, thank you. I found what I wanted to know.
I would feel very assured and happy.
awed
Pretty good
I would feel as if I made a difference, and would have a sense of pride in what I do. I would feel protective over my newfound friends. I would want to assist them in getting used to the customs and culture shock of the US.
Uncomfy; it shouldn’t be about me. I often prefer being behind the scenes.
FUCK OFF
Great but what about food
great’
No grandchild, don’t want kids. Plenty of other people to have em.
thanks
Useful
Fulfilled
Thank you so much
Proud of them and excited to help
Good
Happy
I’d feel inspired
HELPFUL
STOP PLEASE
Naturally, I would feel great! But in many states, there are not many adequate programs to educate, train, house, and financial assistance.. Special Olympics is something that many corporate and community groups can get behind and feel good. But for most of the disabled, nothing really changes
I don’t think being thanked is important but I would love to know I am contributing to making a difference.
Yes that would make me feel good.
i don’t like children can I go back and change my answers
Wonderful, and I’ve done this.
Please read my previous comments about this deceptive charity.
I would just be happy that I helped someone work on something that he wanted to do. Especially if they really wanted to learn and better his life and others.
They probably would say either good job or something like you could have done better
It will make me feel good for being able to help them.
Satisfied
I’ve done my small part
Good
They might tell me their story about how this impacts them. It makes me feel useful
I am too tired too finish this programmed chat.
Glad but wanting her in a more permanent solution
They would be so happy to have a place to stay and they would be able to put the next problem into play without feeling of being unable to! They would feel confident within themself.
I will feel relieved bc they have a safe place and a place to call home
Grateful and humble
I’m not into feelings! I’m an intuitive thinker. If you tell me that the program really works and I helped - THAT is my motivation.
Hey this quiz is cool but please don’t play the emotional manipulation card by asking me how I’d feel providing clean water to someone probably dying from toxic water. No shit it’s the right thing to do! but I was in a good mood before starting this survey, I didn’t come here to be vividly reminded of the atrocities on our planet.
Outstanding
Good
Incredible
As though I’ve just eaten a hot pepper!!
Stop
Grateful to play a small part and sad he had to go through that experience
Good
Exit
Proud
wfulfilled
would feel Awesome Lesa ButterworthI
Humbled
I understand what you are going through for I have lost my mother and father who lost their lives from that ugly word CANCER!!!!
Relieved
I’m broke
not in US
Gratified
People should NOT be drinking cow’s milk
That they were blessed bye God..
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9ExEZG&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBPpIg5ATeJpJqsEvP_wUU7lU4UIUgR0CHu7MbvC--vNA&oe=658DC0CB
Worthy
It’s important to respect animals in their environment.
Blessed
Very happy
I’m not looking to be thanked. I just want to give to quality charities
sad
Great
Warm and fuzzy
Good
Feel good about it
Good!
I don’t know
I’m glad I could help.
Awesome
Very sad
Great
Wonderful
Needed
Really Don’t Know.
Prefer to remain anonymous to recipients,
Been there done that
It would make me so happy to know something I suggested helped someone!!
Never heard of the organization - how much of the funding goes to program? To admin? To fundraising?
Just like human children who need shelter, food, love and attention, animals need the same. And, just like human children, they rely on human adults to give them what they need. It’s our responsibility to ensure a full and meaningful life for those who are helpless to help themselves. I’m thrilled to be a part of an organization who provides this to those in need.
Willing to help more as a volunteer mentor
Stop
Grateful
Stop
I do it on a more personal level
It would make me feel great and happy that it got a new home. I would also feel very proud of myself.
I would be very grateful
I do not need to imagine . I have already experienced this
Glad and sad at the same time
pleaswe remove me im not interested thank you
warm fuzzy
STOP
it would slay
I wouldn’t do it for admiration, I would do it because it is something that needs to be done. People on youtube do these things for publicity, anything good that is done for other people should be done anonymously.
Thank you for saving my baby’s sight. I would feel thankful.
I am not interested in further conversation.
Good
good
Irrelevant
She might say she can sleep again at night knowing that she will never be oppressed or under threat again because now she is safe from Muslim fundamentalists and living in Israel.
You did the work. Glad I could help.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8e2BW5&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAzbcM0Jjx8uYUa8K-HR31e82B0ntxOM7Z-1nCEkmSabQ&oe=658FBB0B
STOP
I would b so happy to know that I made a difference in somebody’s life.
It would make me feel like I am making a difference in making someone’s life better.
Good
I would feel better knowing my money was helping.
make me feel warm
I don’t like the SPCA. There are much better groups.
Stop
Empowered
I will look them up and read more. I have donated to Save Our Bees
It will make me feel horrible I would find more money by the way too make this treatable
That is not true
Good.
gratified
Very good
Cool
Happy
Enlightened
Grateful
It would make me feel happy that I was able to help
Stop
That’s not why I donate.
Good
Happy
sad
I already give to SPLC!
It would make me pleased to have accomplished it.
Stop
Better but not the best
I’d feel good about that
Good
Thank you!
Ok
Wonderful
I’d feel like I made an important difference in both of their lives.
I’d feel grateful that I was able to help this happen.
good?
I am a teacher, so I might be too close to the issue.
mission accomplished
I would feel that God has helped me to find a way to help others.
Good
It would make me feel better knowing that I have been absolutely able to help someone else because I am already blessed to have my own needs met actually I have been volunteering to help as much as possible with the very situation of housing and homelessness since I was in high school
I would do whatever I can
This question is designed to elicit an emotional response I am not interested in continuing this conversation
Awesome
Thank you. And I would feel grateful that I could help.
Amazing
This would make me feel helpful and needed.
No, thank you
Hopefully for future generations to have the knowledge to find solutions to other big problems.
That I made a difference and positive impact in someone’s life.
As a long time supporter of feeding American and our local food pantry (33 years), I can say that providing the basic necessities of life to families is extremely rewarding. The difference between needs and wants is very real and graphic!
Humbled
I work with a non-profit– climate Council Greater Knowledge Center.– so far my money has been going to build this organization.
I would feel amazing
It would feel great but can I take the test again?
Great!
Supported
I would be grateful
I have always gotten a deep satisfaction from helping others and volunteer in many capacities in our community.
Happy
I actually already gave to them as a birthday celebration activity this year. And it feels great. I’m proud of my choice.
I would feel like doing it again.
quit
Satisfied
As long as there’s no White Savior complex involved, I’d be glad.
Happy
Happy
This sounds exciting
Stop
Huh??
Good
I would tell her I am absolutely blessed and would love to help her I too have been in similar situations and will support her
I would be joyful that I made a positive impact on a child’s love of reading and literacy skills — hopefully.
Stop
I like doing charities to feed the homeless and to give to orphans or sick hospital ed young cancer patients.
start over
very good
That I helped accomplishe something for the future generations
Good
Stop
That would make me feel so so grateful and very happy
Gratified!
Can’t
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-DuGaI&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCROW8p-wzmMSAkW4_9K_rwAB9SMSs7AbztzxMcPLNh_g&oe=658FBB0B
That’s awesome!
Useful and elated
I would feel like I had some part in it
Honored.
I would tell him stop smoking
Pleased
I already have checked out the organizations I support but was just curious what the program would say. The problem is I don’t see the needs of the world so narrowly.
Encouraged, satisfied
Very happy
Proud and generous
Meaningful
Empowering
It would make me cry knowing I helped save animals in need
Like I made a difference
not needed by me
The rainforest is teeming* with life because of work other people have been doing; I just gave them a little bit of money to help get it done. But the work is deeply necessary, so I’m proud to have been a small part. And look how beautiful it all is! We must continue to play a part.
Get to the end pleade
The most important message I can give is about continuing to protect and repair the environment.
Ready to help
It makes me feel sorry
Stop
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-OzDAg&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCtcIp2XwmDoxT1Jok4t1TqFKp1xjNeUJkgmnGVX3mcWg&oe=658FBB0B
I have lived in the poorest of the poor countries and know that humans don’t do well all around if their bellies are empty. I have been involved with Feeding America and other organizations who make sure bellies a full.
Obviously, helping people is a great mood lifter and contributes to happiness.
In a person that love kids concerns about mothers and their children keep them out the state show them how they supposed to treat their kids and the time of need or bad work they don’t have to worry about their kids I don’t worry about a daycare on worry about where kids can have special attention and love during the hours and time that their mothers are at work or someone that needs something to eat I can cook and feed the Homeless whatever I just love doing for people that’s my model always has been looking out for people and show them love cuz I’ve been a child before and I never had love I had to learn how to love myself
Good
Thank you, I would rather deal with a faith based charity than secular - think Salvation Army vs Red Cross. I think this should be one of your criteria and more local - can’t change the world, but can change my community.
Responsible
Very good
Pleased that I had tried to make the world a better and safer place
Thank you so much your God sent
Warm and cozy
We can work for change
I would feel that I had contributed to a need
Glad I could help… but about more nights?
Great
Would need deep analysis
Good
Stop
Ecstatic and relieved
I would feel badly for them but I would have to share with them how much Jesus loves them.
I would want to know would they love my child or look at them completely different
glad I could help
Great. Like I did something that mattered
great
I would feel like this was one tiny step closer to helping her get back on her feet.
I mean, I’d feel good no matter if it was me who personally helped them or not.
Feel like I have helped
Glad for their safety out of the elements
That would touch my heart, make my day…
It makes me feel very sexy
If I had a job and could support her awesome. Without work, I need someone willing to support my job search for a middle management job.
I would feel wonderful knowing a dog was going to a loving home and would be happy for the rest of their life
I don’t need a response. Doing my little towards equity is just the right thing to do.
Would feel this is a useful beginning for this person
Good
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8O6s7s&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD1_78R0Dkp79kJjm8dtphBXA8ohP0c4PgAJor2kJmO1A&oe=658FBB0B
This would make me very happy.
pretty damn amazing
https://scontent.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=igKoWEFbQNwAX-puWYY&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDktY2Pu6Mi977ieqW37AAOCu25DQ0K8nUO5PjoUSV7xQ&oe=65910B86
😁
Hopeful
Uplifted
I’m not sure
stop
do you have any other recommendations for m?
?
Happy that I’m helping make the world a better place.
Imagine helping a wounded servicemember recover and live a full life in spite of battle injuries?:
Humbled
first question i was asked, ““are you looking for international or US”“? I answered international. You gave something completely unlike I was asking for.
Very satisfied
great
This would make me feel content.
Good
Stop
Planned parenthood?
Relieved and hopeful
It’s okay I’m here we can find your forever home
Was looking for something that has at the root of mission glorifying God by reaching out to others
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_I2GWC&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDiIrgpPeaoAkO5ND_yL4mQaXy5-p6pV2yXDfHwPHif6g&oe=658FBB0B
Not for me
emotionally fulfilled
They might say ““thank you.”” On the other hand, they could just say ““feed me.”” Either way, it would make me happy.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-e0U8U&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDOF3W3zuqNwqgx3oOGDXyTgmsnuN_Ve9QBcgWeYmAlGQ&oe=6591B54B
No. I’m done.
Good
Stop
Not interested.
Responsible.
Stop
happier than a turd in a punch bowl
Very happy. My main concern is that the world is a cleaner and safer place for my child and others.
Satisfied I actually helped someone
Your welcome!
Grateful that Lucy was safe, and that the lady had peace of mind.
Good
I would feel good and hymbled.
Great
It would make me feel hopeful that humanity finally got the point and learned its lesson
Good
good
Warm
Stop
😊
It would give me satisfaction
Great
I think I would feel extremely grateful to Christ in Heaven. Everything I donate is for Christ and His Children. He is my only Savior and my salvation.
relieved
Good
Proud
I would be humbled.
No, I want them to have a HOME, not just a shelter
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9GIpC3&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB00G8LvJDD2XQ5pHiyAkxmqp0hCib5RKE5hB4kVyWNTg&oe=658FBB0B
I was that kind of child and my mom was that mother
What they say depends on them. Their trauma may encourage them to be silent for a while as they continue their journey. I strive to meet people where they are and have no expectation of how others respond to their particular situation.
Good
Good
Wonderful glad to have helped
Cautious
I don’t need a thank you, helping people is enough. Even if you never see the effect of your donations.
Proud
Satisfied
We took charge of what need to be done that would work for other people and get are brother hope and love so he wants a place in this world
Great
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_2toHN&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAuLrbyEC33_KlKcfx9ZZ6zCiFAxcXXHPZjQ26jSWzGBA&oe=658FBB0B
Grateful
It would make me feel good and sad that she would be gone
They would think i was crazy and i would abd i would not blame them
Helping the least of these is what Jesus calls us to do! 😊
I am very familiar with Donors Choose as I am a retired teacher and am very concerned that teachers have the funds to make learning fun and productive for the students.
Relieved
Relieved
I’m so glad to have a warm place for my child tonight. It would make me grateful I was able to help.
Thankful…
It would make me feel glorious!
empowered
Useful and happy
I don’t have grandchildren
Accountable for both Lucy and the lady. Happy to help.
Stop
Im more worried about the child that sees no value in education
good
stop
Good
I don’t want to be thanked–giving is its own reward.
Stop
No thanks
Very Happy
Good
Cow’s milk in stores is not from cows who had extra. It’s from cows whose calves are taken away so people can have it. That’s what I’d tell the child. I’d hope that child won’t want to drink it any more.
If it helped het good, if it didn’t help her bad
Stop
I would feel helpful, caring
great
Gratified
Stop
Happy
Child should be drinking plant milk!
Thank you. I would be relieved
Satisfied
Grateful that I was able to help.
Happy
perhaps thank you. I would be happy to see better health
No I stopped on purpose.
fine
And thankful that he got the help he needed and care
I will help you
Helpful
Sound good
I would feel sorry for her and take her home with me
Well, I don’t just want people to have a shelter for the night. I want them to have permanent housing.
Like I really made a loving difference
Good
Happy to be able to help put lady’s mind at ease and find home for pet
Probably be thankful I would feel good
I’m done.
We are so lucky and so proud being your grandchildren And you will be a great example for this generation 😀. I will definitely feel so fresh and peaceful 😊
Be there for them. Find out there Needs and try to to help them
I’m happy Lucy will be taken care of
Great
I’d still prefer the child not be drinking milk, but it’s better than the current system.
I’m not sure this is the best fit, I want to try the quiz again.

It’s great to know I am not alone.

Makes me happy knowing I helped someone in need.
Good
Very good
Good
Thankful
Stop
No thank you
Stop
I don’t know about that
good
Very helpful to others.
Helpful
They would be grateful for someone showing up when they needed help. I would feel empowered because I helped someone get through a difficult experience
I’d like to find a charity that’s gets people off the street, housing and then into job training
What about sexual assault victims
Blessed
No please remove me from this
complete bullshit, all cows milk requires forced breeding and taking away the calves, what the fuck
👍
On top of the world
Happy to help
Happy
Good
Great.
Hard to imagine but probably ready to take her in and fix all her problems more for the child than her
Can I take the quiz again
See if I could get him in a new school that will help him
GC: I’m glad you did everything you could before it was too late. Me: I knew if the world became uninhabitable for humans, nothing else would matter.
Great!
Happy
Pleased
Fulfilling
I would say that’s unrealistic. A better solution would be veganism.
Make me feel like a real hero
Curious about how they are coping with a culture so different from the one that they are used to.
That would feel very good, but might make me cry.
I have a 10 yr. Old blind poodle I just adopted & a 10 yr.old Chihuahua that I have had since a puppy & a 8 yr old cat . It bothers me that ASPCA is sitting with 3 million dollars in their bank account . I think they could make better use of their assets ‼️
Great
stop
I was in a similar position 30 years ago; the law and policy focused on equity assisted me so now I’m in a place to assist you. Sisters must help the generations following us.
Fulfilled
Would everyone do the same. Sleep safe
Nonplussed.
good
Stop
Pretty good
Pleased to have made a difference in someone’s life.
Good
No idea
grateful
Amazing, thankful, hope
great
thankful and humbled
Stop
Really good. But unlikely
Valued
I’d feel like I had a tiny part in shaping his or her future
Stop
Like I am making a difference.
What question?
Pretty good
Charity Match Quiz!
Could we end this conversation please
Good
Fulfilled and filled with love and pride
Good
I said I wanted to concentrate on charities within the US.
Woohoo! We did it,
It would make me feel very sympathetic
Amazing that I could help. These folks are not invisible. They are entitled to a safe, clean and secure environment
done.
I’d feel so grateful that I was able to help
Can I do this again?
Humble
I expect he might say thank you. I’d probably feel humbled that what ever little bit I had contributed had helped him from a circumstance that I can hardly imagine.
neutral
Close to her and hoping she will inspire others.
I don’t want to get to know them.
I’m not really in the mood for creative writing just now
STOP
But what about Greenpeace? They seem really cool.
No thanks. I support Makindu Children’s Center
Great
I like it
Pretty darn happy
great!
I have 30 yrs experience in the field. It would feel awesome to share information with the jobless
It would make me feel very proud
Thanks
Proud and helpful
Great
It would depend on if they got a job!
Stop please
It would make me feel better and I helped out the family
Good
Gratifying
It would make me feel good.
like I’m part of the solution
I would feel inspired to do the same. I’d feel seen, and supported.
Good
I’ll be a drop in a sea of good
Great
Mass shelters are not what I want to help, more like help for the homeless who are in camps and along the roads. Shelters don’t help just make dollars for the provider. People need a place to call home while getting themselves to a place where they can find a real permeant home.
This would wonderfuĺ, I would encourtage this person to stay with his learning and strive to go further in his training.
Stop
I don’t know Good
Stop
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8aPfto&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBNISB1WAU5ZVxFKVRDd4tKXPyrHsuRjNagpHlEBiXBlg&oe=6591B54B
Stop
Good
No
Pretty good
Bye
Good
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-kghtY&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAXRmqynej1jayTq-fuRNW93SNTwiFbEtVuOz0CHv_VzA&oe=6591B54B
Great!
Great
Adequate - within my means
They’d say ““wow, thank you.,”” I’d say ““you’re welcome.’
It doesn’t matter to me what they would say to me. It only matters how they feel - are they happy, feeling seen and cared for.
Grateful that I was able to contribute.
It would make me feel good.
Stop
Grateful to have helped
I do not have, nor will I ever have grandchildren! I’m distressed that you would try to force your heteronormative way of life on me!
good
Needed
Good
???
Leave
That sounds really good
That would sound very good!
Prefer not to answer
Super
Productive
Amazing
Blessed that I have the funds to be able to help
Good.
I volunteer a lot because it keeps me humble and reminds me that even the best people can fall on bad times. It has nothing to do with how I feel.
Happy
Gratified
Awwww. Would be great. Seeing foamy orange industrial waste pouring into and polluting the Cuyahoga River when I was a kid (in the 60’s) in Cleveland really horrified me. I used to imagine that if I had three wishes one would be to clean up all pollution. So, glad to hear about this effective charity. I’ll check it out.
I would make me feel very good.
I would feel so good knowing that I saved another sweet life.
She would say thank you so much. I would feel great that I could help her.
Fulfilling
Like my help had enabled them to continue safely on their path to a better life.
Happy
Good
Food and physical safety first
Relieved
Good if I could help 😀
YOUR QUIZ DIDN’T WORK
Cancer make me feel stressful
I support Relay for Life in 3 or more of their events every year for over 20 yrs. Also Eagles Autism Foundation, Donors Choose, St Jude Hospital, 2 Veterans groups and Rare disease. Medical programs and research are my priority.
You haven’t given me the name of a charity yet.
I didn’t get the name of a charity.
Is this a scam of some kind? I’m not getting answers.
What is the answer???
The app did not give me a charity name..or who I might imagine I am talking to.
Who?
Does that exist? What is my charity match?
I don’t know that’s why I’m asking you
The bot doesn’t work
To whom?
Okay, I don’t know what you want me to do here. I’m supposed to imagine talking to what? Still waiting for my charity match
This is a waste of time. I answered the questions, it says nothing about what charity it is…..forget it.
Well since don’t say who I’m talking to I think you need to fix your program
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_foV2o&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCHDxfKapMZ-ghTVLUy7af_LRfsy_h_W07PT9ggBinoxg&oe=6591B54B
this is obviouly a scam
https://scontent.xx.fbcdn.net/v/t1.15752-9/400920111_368370812403953_2824955597406204803_n.jpg?_nc_cat=110&ccb=1-7&_nc_sid=b65b05&_nc_ohc=uzffeNG00A0AX-zm_ke&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=03_AdTijZH8kPARiZIhJJE-nWBOV6ExtR4sD9n65TOkrda1zw&oe=65B5241C
This is not working. What charity? Talking with whom?
Good Bye
Haven’t thought that far since just heard of this
Grateful
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8TU14j&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAK4TYc2VZBLijhmIBMhxSiBwZTEm9MS4kQKBjHwo8GcA&oe=6593AF8B
I’m so glad i was able to help you. God Bless You and Your Family.
Awesome!
Good
Proud
Good
happy
A little edgy because charter schools take funds away from regular public schools so the problem in public schools only gets worse.
I chose to leave the chat
Empathy
Grateful
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-RxTJ_&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDuUWIagCWtnQgU-JVdU6ArzkyvnkZn8_qkVEn-_PIe4g&oe=6593AF8B
great
I will be very nice😊😊
I hope you will get an education
Horrible
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9ruk8G&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDxzbdY0O5D7FcxNq0eivxwFQprIDse7Wv6IxtHRfJWqg&oe=6593AF8B
I have to leave an emergency came up,,,sorry
Great
People would be appreciative (hdopefully).I would be happy ,reservedly.Congratulatory wishing the new owners all the best
Knowing the answers and the information behind the answers.
Very good
I am grateful I’m safe for the night.
Help me
Great
Pretty good. But I imagine their effectiveness could be impaired to some degree by the living conditions of the neighborhood.
Good
I have no children or grandchildren and never will. I am also autistic so I don’t relate to other people well. That is one reason why I feel that environmental protection is important. I am more interested in restoring the planet and protecting animals than I am in people. The number one thing wrong with this planet is that people are grossly destructive and there are far too many of them. Honestly, I feel that all attempts to save the planet are doomed to failure. We need massive population reduction and an end to wars and dictatorships. That isn’t going to happen so the planet is doomed. All we can possibly do is slow the destruction. I am very, very glad that I never had children.
fuck off
pretty good, but I have broader interests, too.
great
——-
Sorry for the lady because she needs to survive I’d try to help her where her needs are most important to her
Great
tell me more
Motivated
like I helped a lost soul
It would be a special thing for somebody to take care of a dog and love and protect it and
Sounds like something I’ve done before.
Like I had accomplished something real
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-o390B&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfASi8t6cM9HjcieY1xm06eLvoPraJ7Mx7cmJOTu1M_aEQ&oe=6593AF8B
Humble grateful
Know that I directly contributed to a good cause.
Stop
Great!
Good
Meeting a need
I hope very good .
Ok
Good
It would make me feel good
I googled rocket ship education. I’m more likely to give locally.
I think that she and her children would say thank you and possibly cry in relief, and that would make me feel amazingly fulfilled.
No but thanks
I would feel good that I was able to help someone
Proud
My grandchild would probably not understand what progress had been made. However, I would feel I had lived an effective life.
Probably guilty. I don’t volunteer for people to thank me.
Wonderful
Stop
Good — but right now I’m giving to Doctors Without Borders, Donors Choose, Audubon, and Cornell Lab of Ornithology. I just don’t do well with multiple choices where I can only choose one.
Stop
Thank you
It would make me feel great that I could help.
hopeful
Like a Hero!!!
It would make me feel good and happy
Good
I’d imagine I would feel like my contribution made a difference in that child’s life
grateful
Grateful
good
Proud
Fantastic
Like I am part of the solution.
Grateful that I could help
Like I made a difference
Fortunate
I wanted something mental heqlth related
It would be a step towards the dream job that I have wanted most of my 77 years. A philanthropist.
i’d rather help already grown adults
Good
It would make me feel good
I’m cancer free now but who knows it could come back
Supercalifragilisticexpialidocious
WOW
Inspired, motivated to help
Happy that one night’s problem would be solved, but worried about the rest of the night’s ahead.
Good
STOP
Okay
If I’m going to be honest I have no clue how they would respond they could respond with a good answer which will make me happy or they could answer with a bad answer which would make me feel really sad
start again
Like I made a difference
It would make me feel amazing I have to give God all the credit
Pleased and proud
I would feel proud of our accomplishment.
Rewarded
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_fruqa&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC21Cy-dSWO3Q0GqQpGe268ta1k38jxKil7UOWOy1b5ZA&oe=6593AF8B
This is not for me
Okay
It would be a great start for me.
I wouldn’t sit them near a Garbage Island
Too many either/or questions!
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_Y-Ge1&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCVtggBUYjYnq8avfYcl4KSO6o9zqx4UpKlpCM212HnIQ&oe=6593AF8B
Relieved for this family and feeling grateful I can help
I have no money to give to charity.
grateful
GREAT
i’d feel that my life had had some meaning to someone other than myself
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8UQ5nm&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDiSj_BiMEXJFVLUT6mQZkFYn1Sk_SQNpe3up1OyJRwow&oe=6593AF8B
No
Amazing
Good. I want my pet taken care of
I would rather donate to no child goes hungry or homeless
Sorrowful
Stop
Like I made a difference
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX90QgTe&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCAisWOdhWPLd-vTJXw34eJYUVu2YScCo-cPDCqLIyjBA&oe=6593AF8B
Stop
Been there, done that, doing that. Just need to bump up to community planning. Thx and goodby
I would rather not have this interaction
Love it
great!
Satisfied
Enjoy
I would like that but I don’t have the resources to make it happen.
Good
I already sponsor 3 children through Compassion, work with Habitat for Humanity and contribute through the ELCA to support emergency care where it is needed most because I know 100% of my contribution goes where the need is. I sponsored the children so they are able to get and education, Habitat because I believe everyone should be able to have safe housing and my church because I trust their ability to use my money where it is most needed, like right now some of my money is supporting Palestine.
Happy I could help
Of course, good.
I don’t know how to cook. I don’t have the tools. I would get the tools for her and cook the meal with her. And work out a plan for future lessons.
I have a negative feeling about this charity
I would feel thankful and proud
For the third time, I’m not using your charity. Please do NOT contact me again! I’ve given my answers!
It will me feel so good.
Praise God
Since this is the story of my own child, I’ll share his thoughts. ““Now I can be somebody!”” To hear those words are heartwarming and tear jerking. To help a child who believed that without college they were nothing and change those thoughts into positive ones andmaking a dream come true is beyond words.
what arrow
Thank you and good
It would make me happy to know that I was able to help
Content
Enjoyment because of it
I wish I had money to help but I don’t but I pray for them
I love habitat for humanity
no thanks
No one takes trees away needed to preserve animals and US
I hope this will help generations of your family and community
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_O1PKW&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAKtUxRXIz0uMWeyNg6hETzj2g6u-ToL8t0dpAcFjU5OQ&oe=6593AF8B
Like i made a difference in this families life
Amazing
good
good
👍
I will Foster cats and I will be the one to keep them and find them a good home I am not donating money I will donate my time
I think this is a good idea for everyone
I don’t know how I would feel r what to say to them
Relieved
good
Hoping that it’s true. 
great!
It would make me feel like I was making a difference
I’m more interested in High School kids
I think we need bigger answers than beach clean-ups.
good
Relieved
That sounds awesome
Impactful
I’m leaving the chat. Goodbye.
Like a decent person
extremely gratified
This sounds like the perfect charity for me. I love that they mention Scarborough’s Rope. I will look into this further.
I donated to Feeding America and feel good about it
I am more interested in protecting the old growth forests in the Pacific Northwest.
Thank you
warm
good
Why do my feelings matter in protecting their life and sustainable development?
I don’t want to donate to large animal charity. They already have a lot of money, and their top tear CEO are always making MILLIONS.
Nevermind
unrealistic
Don’t want to go any further
Great
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-tWpb0&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDgC-VUP9TGUrualkrxG65UX603xvIlJwSU9lEyrZgbgA&oe=6593AF8B
My money won’t change it, I just can hope it helps
Humbled and happy I could feed her and her children
That would make my heart so happy
I mean, that’s great and all– but I encourage you to steer away from prompts that include children. There’s lots of folks who don’t want kids, and there’s so much emphasis placed on kids in environmental work– it’s kind of frustrating, when it’s adults who need to do and take responsibility for the work.
good
Great!
New test
Absolutely wonderful.
Thank you so much .I would feel that my efforts were welcomed and necessary .
Happy
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_Npgcz&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDKNDpVBG2lwmWCb1x950YPx4ygSnxJG11xUJFxJQndlw&oe=6593AF8B
Uncomfortable. I’m not looking for praise.
Great
Sorry already have donated 10,000 books
pretty godo
Good
Very good about my place in this world
Happy
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_gzNj_&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB8c7jqJA-oW4LGgc8bz8DbFzK2ig9l060iStg0H3bD_w&oe=6593AF8B
Proud
Thank you for making sure I’m safe when she passes.
Wonderful!
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_KpoLA&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA3-fEqNUvZk157rHx6PUn1oIZycyVbkYWgpERgYwc0OQ&oe=6593AF8B
Very good
Good
Grateful I could help
Relieved
Thank you, Granmom !
good
Better
I was thinking more about rare kidney diseases
Good
Stop sending messages
Not sure, most shelters are scary places.
Useful
Sorry I can’t do more.
Full of pride.
Gratified
stop
I am much more interested in teaching children music and the arts but that was not an option. That omission makes this survey rather biased.
i know such a person and give to DF
Grateful.
Good.
As an LGBTQIA mom to 2 LGBTQIA kids, it would make me feel amazing
Great BUT I have never heard of this charity
Helpfull
Good
I am doing water projects through rotary international and wonder if they’re an organization that you find yourself recommending at all. You can contribute to the foundation without being a member of rotary and they are highly transparent and respected organization
Grateful that I could help
STOP or I’ll BLOCK YOU!
good
Trans lifeline
It would make me feel happy and blessed that I could help someone.
So you want me to donate to a specific charity that you directed me to. No. 
Remove
Stop
I’m on a fixed income
Proud and grateful for helping
I would feel like I made a difference
Relieved.
Nope
Excellent
Gratified
It would make me feel that I had done something worthwhile.
I would feel like I had done something worthwhile
It would give me a peace of mind knowing that I could help them
It would make me feel good.
Something more local to me
Proud
It would be the meaning of a successful life.
content
Fulfilled
I am that old woman and I would not give he care of any animal to the scam of the aspca
Good
I’d feel like a good human being again ❣️
I would feel happy 😊
Glad to have been helpful
Ive done it
Happy
Touched and grateful
Hopeful
I can sleep tonight knowing my child is safe.
Obviously, it would make me feel good.
Happy
I would feel awesome helping someone get the treatment he needed after all his job was to protect us and to help him I would definitely feel blessed
I don’t think every child should go to college, so that goal troubles me. I think every child needs a good, fundamental education and a path to a rewarding career. If that requires college, so be it. There are lots of very rewarding careers that provide both meaningful work and excellent pay and don’t require a degree.
I would help find a home for her pet.
Stop
I would feel very good as I am 83 yrs old and want my pets taken care of when I’m gone.
AS if there is so much more that needs to be done.
Amazing
Thanks
Do they accept trans people?
I will feel happy in heart knowing I brought peace to the lady in her last days and the dog will be taken care of and safe.
We need to support the public school system more
Happy and content.🥰
thank you - great
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9l37KV&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA6vpndZwDSK21KOb4Iwr8-_10TwwiTxgoR3Eler3kylQ&oe=6595A9CB
Great
Humble
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_rLMvA&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAIly2l16jmCOIe7lRDcMQO8SyV00RrpZCCb3xrg0ux4w&oe=6595A9CB
Very good
I’d feel much more optimistic.
Like I made a difference
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_lkW7X&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBD7f8XEnDem4yHBrSvZLrywcE0nSifx5xYtobCDXlN8Q&oe=6595A9CB
It makes me feel great
Obviously, it would make me feel good……that I helped in some small way
Rotary International is my chosen 4 Star Charity
Great!
Stop
I did a very small part in protecting this ecosystem. All I did was to stand up against the deforestation by my actions, talking to people and donating money to the cause.
I’m sure I would be the happiest person on earth if I was able to help with Elephants. I absolutely adore them. One of my dreams was be able to help with Elephants.
I would feel gratified that I made a difference in her life.
Embarrassed
I am more interested in supporting members of the LGBTQ+ community, and seeking equality for all
Glory be to God!
I would feel so good about helping
pleased
Blessed
Good and useful
But have I also relieved or prevented sufffering?
Fantastic!!
Thank you
Good
Who is ““they”“?
Grateful
Really good
Very concerned
what about a knitting charity
Proud
Stop
That I have caring bright grandchildren who understand how vital their contributions are and how difficult it is to insure their children and grandchildren grow up and experience the rain forests and all the creatures in them!
This organization is too mainstream for me.
Great
Hopeful
Humble
Depends on the content of the book that is provided. I would be strongly opposed to content that conflicted with basic, core scientific truth such as there are only two genders, truth exists and stands independently from belief, etc.
Happy
Good
Accomplished and satisfied.
not inclusive enough
I would be pleased that I could help.
Like I’ve done something to make this person feel good knowing her girl will be taken care of
I’m done now thanks
Grateful
I am done thaks
Relieved
Fine
I would feel proud and happy that my grandchildren will have safe happy lives
Stop
I would be very happy. Continuing love and care is very important.
Good
Great

I am not sure what she would say… thank you or I hope this works .

I would pray for her…

My mother died of ovarian cancer.
Wonderful
NO
Useful
I would feel proud and some relief that at least one hate group had been thwarted.
I would take her and give her a good home
Go without food
This would make me feel good .
Very good
Honored
Cancel
great
One of my goals is to leave the next generation a healthier place to live.
Very happy
Okay
Helpful
Relief
Feel good to assist others
Stop
I would feel like I made a difference. I regularly donate to World Central Kitchen.
Good
Like a grown up. It’s what an adult does. Unfortunately we have many grown up children these days. Don’t get me started on that. LOL
amazing
That I have an impact
Great
I thank and iwould thankthemfirthieelGod for his blessing of foodforthem
Thank you.
Purposeful
You are way to optimistic about the solutions to this problem
happy
STOP
Not interested
Grateful
I would fell blessed to help some one who needs it
mine would say why waste money on that?
Embarrassed
stop
Over whelming
I would ask the family members if they would be able to help take care of Lucy or if I could help them with trying to locate a family that would love to have Lucy and take excellent care of her.
I give monthly to Feeding America already
Grateful for healing and the fou6.
nothing they could say would shock or scare me and more importantly I would listen to what they need or are afraid of in the moment
Proud
It would make me feel appreciated for my small action but sad that couldn’t do more.
I’d be happy to teach a child that it is ok to drink the milk from happy cows.
Great!🥳
Very good.
great!
Great
Glad that I helped, and thankful that I had the means to help.
I would prefer to give to my alma mater’s first-generation program.
gladly let her know that we are pleased to bring box of food for her & her family she would probably
I would be proud of them
She would feel confident and secure in knowing that her dog would be cared for. I would feel humbled and grateful to be able to help.
How can you help me? I would feel involved.
That what I contributed made a difference in someone’s life
Blessed that I could help.
It would make me feel good inside to see some family have good filling food.
My financial donation was working where I can not physically be present. It would give me a sense of satisfaction and knowledge that justice is possible.
Helpful
Good
End
I already donate to TP
Empowered
not sure
No thank you. This was not the charity choice for me.
I would like to help children with brain tumors
happy
Proud of myself for being a part of the larger picture to help heal our planet.
Helpfull.
satisfied
Happy, successful, ready to help again
I wouldn’t want them to feel embarrassed by my presence.
go away
It always makes me sad that people are in these situations in the first place.
Please remove me from your contacts.
Awesome!
Effective
Great
Gratified, but I don’t need to hear anyone’s personal thanks… just want to know that I’m helping
Thanks for pushing me in the right direection to fend for myself in the future.
I’d feel happy that justice is being done.
I would feel good that I didn’t just meet an immediate need, but that I helped prepare him for long term success.
Grateful
happy
good
sublime and relieved
I guess it would make me feel like I accomplished something
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX8vnXYv&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCOZqgfXu9YBTv42jK0dQ-fRDuKCjEvlMhwVgV7IIfP6w&oe=6595A9CB
i would feel wonderful
So what,help him
That they are grateful and at peace and I too would feel grateful and at peace!
Relieved.
Wonderful
Stop
I am done. Thank you.
happy
It would be great if a person learns a way to keep themself afloat on a day-to-day situation.
I have great grands; I would hope they could get to appreciate the earth
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9PrQ7J&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAD7uVGtf6CN7UBV_EmZuXqv4Btao47uwY65Z8qmfJBCA&oe=6595A9CB
I love animals and usually give to Best Friends, but will consider ASPCA in the future
It would encourage me to continue helping.
Good
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX88lHsi&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC08BDuNwZST69ySudljLom1u9xN6cg0WmutvqHGSielA&oe=6595A9CB
Alsum
Humbled
I’d be thrilled that the student’s life was so positively impacted
Grateful that I was able to help
Happy
It would be gratifying
Great! Especially if it were in large print or braille so ALL readers can access reading opportunities
Really happy
Which I never had kids
Feel great about it
I quit
Good inside.
maybe
It’s really convenient
I can’t take responsibility for the great lawyers at SPLC
blessed
Bullshit. The ASPCA is horrible CEO Matt Bershadker makes nearly $1 million a year–$881,785 in base salary and $108,740 in benefits. That works out to $424 an hour for his salary. Other top executives earn huge salaries of $468,538, $420,613, and $385,415 (and more). Overall, 259 individuals earn at least $100,000 in compensation. The ASPCA has about $11 million offshore in the Caribbean. The ASPCA gets a “C” grade from CharityWatch, which calculates that 42% of the ASPCA’s budget is spent on overhead.
I don’t have any children, therefore, no grandchildren to boast to. I want to eliminate all plastic waste from all the waters where all animals and birds either feed or live. I’m not into prettying up the beaches; let the people who go to the beaches do that. But in reality my favorite charity is me. As George Eliot wrote: One must be poor, to know the luxury of giving. Well, I AM poor and, besides feeding/clothing/housing myself, giving to myself in the short time I have left alive is the only luxury I can afford. I’m just the right kind of selfish because I know exactly what to give and where my giving will do the most good.
Like I had done something important
Great but now I need to sleep
Thank you
I would feel sad for them, but also thankful that they were able to make it to where they are. I would feel compassion for them.
Sad it’s not in the United States
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_zfKWA&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA-guOTehktrwM-1Kb_xdhpG8FJcmczj3VKwkbhO9uh0A&oe=6595A9CB
Great!
Like what I did was actually making a difference, not simply putting a bandage over the real problem
🙂
Awesome!
Good
thank you
😊
They may say thank you and what prompted you to pick this charity
Happy
Thank you, I’m done, very interesting experiment. Bye.
ok
That I was helpful.
Joyful
good
Awesome
It would make me proud of myself for helping people
STOP
Good. I had hoped to help marginalized women within the criminal justice system.
They do great work. I used to be on their mailing list.
He would be grateful and I would feel pleased that I had made a small contribution to a better world.
Joyful?
Like I made a difference in their life
I don’t have grandchildren, but I care about our planet and people
I’d rather help the homeless, who I feel have a more immediate need for help than a soccer player.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX-88MJI&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA3TiENt9VZT6Zeqa6MrgyQX7ra3s5R2DeIQycPSAaiXg&oe=6595A9CB
Doesn’t feel like the right fit.
I am not interested at this time. Stop.
done
Empathetic
I give money to Amnesty and write letters on their behalf
Outstanding
You don’t have to sell me on reading. I was a literacy volunteer many years ago. I worked with adults where English was their second language. I also had 20 nieces and nephew’s that I read to quite often.
Not good. Shelters are not the answer.
Like I had made a difference in their ““forever”” world
Happy
This scenario is extremely unlikely
😊
good
Very happy
Thankful
Have donated to Amnesty for over 50 years,.
I read about it every day
Ok. I’m done
Grateful
positive
wonderful!
Good, but like I was applying a band aid.
good
Relieved
Great
did you know there are 10 states with no expanded medicaid for adolts with no minor children?
It would make me feel good
Happy
Happy that their need was actually met— not just talked about
I’ve volunteered as a headstart tea her for a year from imagination to 3 years old but couldn’t deal with the abuse and the beating of the children and to have to take the children vack
great
already support St.Jude’s
Good
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_k4XqW&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAPB4ErSE-thGrWWQzP5TVtWjLvsonQqFdcYP3BUyRLXw&oe=6597A40B
I’m sure they would be very grateful for my help & I would feel fulfilled!
Opt out.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_ybp0y&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAHBKnAlx3Q_xyZ01oIWwTT_aXU6U3ds1ZCCXI7aBcQJQ&oe=6597A40B
I don’t care what they say to me. I just want to know that I made a positive difference in her life.
Please help me
Helpful
Gratified
Great
Awesome
No comment
All of my horses, cats and dogs are rescues. Always have been. I contribute to local rescues. So the old lady would get good direction and support.
Blessed
I’m terrified for my children to live in the world we are leaving them. The government is not doing enough.
Humbled
Like I was making a difference
Pretty freaking good
Proud.
Grateful
I contribute to Orphan Kitten Club, Kennel Compares and Animal Humane of NM. I can’t support all
ThNk you for your support in extending my life.
Proud and happy.
My grandchildren are all adults now, and we talk a lot about environmental causes.
Bless you it would add joy to my heart
I would hope that she would not feel any obligation to thank me. That’s ridiculous. She deserves safety.
I would rather play video games.
❤️
Good
Awesome!
Fantastic
You are welcome.Lets find something long term.
Stop. I am quite comfortable with the charities I support to help refugees, displaced, and hungry. Stop.
I would be thrilled.
I would feel happy and content to serve my duty to care for those who don’t have a voice.
i hate aspca -
I’d feel terrible
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX-HDb0P&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAZNIIfI23YspnIpPN_Qpxq0ClGEBLesoeZTwCD0W-P-A&oe=6597A40B
Pleased
This would make me feel really good
grateful
I would feel like I had done good. I don’t give to this charity, but I give to food and housing organizations in Oakland and Berkeley.
I watch a lot of nature shows. The more the better. I’m not fond of bugs snakes or spiders. It never used to bother me, but it seem as I got it makes a difference. Sorry, I’m a candy butt now.
My son has a life threatening disease ignored by most
It would make me feel good.
Not do good
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9I--2_&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDjZkHkAHdrsikliTzXXlNd33PRRanjdR1GsXJgFYUlKA&oe=6597A40B
Not interested
Satisfied
Really good and proud that I could help!
pretty good.
Stop
Wonderful
It would make me feel good
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX-bXxBq&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB1QJ2T2ozvndKzuG72y1SaGMUTJPQ7T36FzN9kPs9SYg&oe=6597A40B
Buzz off. Your survey sucks.
loving
Good. relieved to know such an organization exists for when I get older and wonder about what happens to my animals.
I wish that was the case….that milk came from Happy cows
A better environment for the future generations.
I am already a long term patron
Weepy and happy, but also sad I couldn’t do more.
It all sounds good but this questionnaire is not helpful.
It makes me think
No reply, thank you.
I love it. Keep learning.
Forget it-sorry I even tried to do this. Very limited charities!
Proud
Happy
That would make me feel great! But give me a local organization
Excited
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX9gAZL8&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAqg_m9Kgk193wC76T6aMrJ-65s5LaFn7TLU045A1EdYQ&oe=656A284B
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX9U3COE&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfDDKFCMlGtDIgFBiZP581CeZm4HcMZ4mwRVtYzNwmKK-A&oe=656A284B
Rewarded, humble, proud
Great
Good
Wow
So what do you have in mind talk to me honey
Overwhelmed and excited that I could help transform individuals I to successful adults
Thank you
Wow
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX8w60VO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDZ-CRdq3l-rdxun0z7Y12B4h_cJz2QtHjBhKl1fYzs5w&oe=656C228B
Grateful and happy!
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX_pMdMk&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBYoqS2MvNfezfTP3N3tTHkOU35regDTPmaMdYU1YhIFw&oe=656C228B
Great idea how do you know unless you try
I would be feel fantastic, particularly if my grandchild had no idea or concept of what a garbage island even was due to such a clean ocean
Happy
It would fill my heart
knowing that they have a safe and warm place to live in and have warm food to eat
i would be very up set and pray to GOD to help me
accomplished
How could I say
That would be awesome!
Very good
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX-oO0qU&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDh_GgUNIJp7wTv1TPJLg0fOCpEw7IjmKRuYiTe1aUoag&oe=6570170B
Amazing
Goodbye
Amazing. I’d love to help them.
I would encourage her to by safely
I would feel good being able to make sure that they would have a fighting chance of life
I think I made a mistake getting on this
I would feel great
It would make me feel very appreciated.
A RESPONCE
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX9wIwl9&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDtQSkumEH7Rb7wZL8_tMvRm9y9KMi3lgADafnRrAfLYw&oe=6572114B
I don’t have children but it wouild make me feel fantastic
It would make me feel wonderful that a mother would be able to feed her children. If she is a working mother with no husband to help, I know she is doing the best she can to provide for her children. I’m sure she would be very grateful for any help.
Happy
Very proud
Not really sure how to answer this
I would feel many things especially how greatful I would feel for being able to help the family I would feel honored to do for others !
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX-3YCI0&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCiImxLEFWsMYejCk2xwLV65V1dTO9etGwbf_XkaZfiiA&oe=6572114B
Impress
https://cdn.fbsbx.com/v/t59.2708-21/355796881_1276586876618477_8031109614283727481_n.gif?_nc_cat=103&ccb=1-7&_nc_sid=cf94fc&_nc_ohc=7FZxylfzx7cAX-8Lf1y&_nc_ht=cdn.fbsbx.com&oh=03_AdQ0c-mlkeoMeO4_8ADJQt3JU7QW9cf00kLFVZzPgMzPZQ&oe=65707120
Okay
Well fill good because girl will rich school earlier so that to start learning
Good
I’ve very little idea what that person would say. I doubt he/she would be hugging my legs in thanks for giving a few cents.
Hell no
Great
Awesome 😎
I’ll feel proud
https://cdn.fbsbx.com/v/t59.3654-21/408253731_1021064522511039_1768092292428029293_n.mp4/audioclip-1701898277000-257824.mp4?_nc_cat=107&ccb=1-7&_nc_sid=d61c36&_nc_ohc=YnBx-5AVM1IAX9W-f-n&_nc_ht=cdn.fbsbx.com&oh=03_AdRfSXwFwCLdPJ6Q3_fbj0MB08iks7pYP4zasuYjmFgS-A&oe=6572DE23
Opt out
great
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX_Kd1uU&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCLUZI5dQVMx5vYcGN_hj7m1Mka5SKOVg3XBM-Oi-ZfJQ&oe=657605CB
Good.
I would hope more to be cured
Chatbot I’m a very different breed of men and really don’t like publicity. Whatever I do, I normally do it in anonimous way, because I’m not looking for glorifying or anything so please remove me from the list of participants. Thank U much
I will provide clean water
Idk
very good
Joy in my heart i believe we can end homeless more then a night
Greatest
Happy
Great but l don’t have it to give I need help
I’m so glad Lucy will be taken care of. I’m glad she has you.
Nice man
i will feel badf
good
Would make me feel I helped someone have a better life
less word can help a student learn. then pick up a few more slowly then pick up speed in reading king thoughts
I would thank the Lord that I had the courage and the money to help people
Very good
I would feel good she would learn how to read
Yes!
Overwhelmed
I’d feel proud
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX9RI2PO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDYJ6FildH8WaoO_dwvLm0Q7044otwM-plSOz5QISFkbQ&oe=657BF48B
Grandma, this was all going away, and you helped to save it?
it is getting late , I need to leave
glad I could do something to help
proud that i have made this happen
I’ll do all that I can to help accomplish their dreams
That would make me feel as I made a difference in one’s life in a small part in time
Good
good
Imagine what they might say to you
I need help myself
I would said love you
Thanks
I will lick pussy
johnny depp or andy gibb is my dream
I would feel sad and miss them of course but if it matters them in the long run and they will be happier I’d have to say be happier. I won’t forget I’ll remember!
Embarrassed.
Very good because I like helping people
Thanking for helping me, it would make me smile
well, I’m 70 years old and have no grandchildren
Good
I would feel overjoyed
STOP
Bad
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX-Yv2xX&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfAkrwI-clOwfaNbiHKoPBVndH0qid_TsYAEb_PzNW-Z7A&oe=657DEECB
It make me feel great n positive about the environment and my life n my family’s life also
Sorry hit the wrong Button all Good
I would want a permanent free home for families. Life isn’t cheap and keeping a home for a family is very important
This would make me proud of my client I helped and also proud that I was able to do so. Thank you for the time we trained together and my best regards for you and your future
They would be very grateful and I would be happy that they were safe
Good
Good
Good that they are finally able to move forward
https://cdn.fbsbx.com/v/t59.3654-21/410857435_249967967901912_4607731210678087945_n.mp4/audioclip-1702686881000-60256.mp4?_nc_cat=105&ccb=1-7&_nc_sid=d61c36&_nc_ohc=a7qS8bIkwx0AX-qw0ka&_nc_ht=cdn.fbsbx.com&oh=03_AdQmz8OejjRGui0SuvOX513HG1EN7kVyiFIlnXyd04bXyA&oe=657E614A
I am homeless and living in a shelter now
Pretty good, I guess
excited to have helped and proud of their acomplishments
Overwhelmed with joy because of the fact they were comfortable talking to me about there concerns.
impactful
Good
ok
I WOULD BE VERY HAPPY TO HELP SOMEONE IN NEED, I GET HELP MYSELF..
Okay but I usually donate to animal causes
It would make me feel great to know I helped an elderly woman and the dog.
i would feel great about helping a young family
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX9KNnFE&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDYZq_ZyuHDAIF2_WBGcRcdd3bdDR4pG7ip5fZhPcZCKA&oe=6581E34B
good
Great
Accomplished well done
Bad
Wonderful
Pretty amazing and humbling
Uplifted. I donate to dozens of organizations, I don’t get that kind of feedback.
Good
I don’t know how I feel
I don’t have grandchildren and I don’t trek, but I have relatives in India.
She will say Thank you and it was delicious and grateful. I would feel very grateful that I was able to help the family.
Son
can we start over?
I would feel super happy that I was able to help someone reach there goal
Worried what about tomarrow
Good.😌
Good
I feel so happy and thank for giving a good heart of serving humanity in the world
I had a cat and she was a 💗 bug set right next to me in the recliner and purring licking my hand and sleeping 😴 on my bed right next to me and keeping the mice 🐁 under control I really miss her for Her name was Leah she adopted me then I know I gave her some food to eat outside the house when it was cold 🥶 in the mud room and she adopted me talk about a Love ❤️ bug she followed me into the house and would not leave until she had to go to the bathroom for she would let me know about that so I brought a cat box for her due to I live out here in the country were there are critters that would eat her quickly
Wonderful
Happy.
stop
So good
Ifs I have it I will help them
ok
I would feel like my investment in this charity had been a worthwhile one that has contributed to good work.
Good
I guess ok
It would make me feel amazing that I was able to make some feel safe, comfortable and happy.
https://scontent.xx.fbcdn.net/v/t39.1997-6/365213689_1626311647858763_8975721824572341173_n.webp?stp=dst-png_p100x100&_nc_cat=110&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=7nzeh8tbyLMAX8UUOOp&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCIcvTVYzTxzv4FjJZ3z9fErV4qKNDHgqZHM7azN1H7IA&oe=65862759
Yes
I don’t know
Exciting
Great
Proud
They would say “Thank you” Whether they said thank you or not I would feel feel really relieved that the air was clean!
helpful
I would like to be there to help her tuck you in or tell her in and tell him you are welcome God that for everybody to have a place to stay
Smart and intelligent
Happy
Which arrow
Good
Sad
It would make me feel great
Excited
Amazing
I won’t have children so I won’t have grandchildren. Can I redo this quiz?
I’m retired and low income. I get help myself. I can not contribute anything.
AWESOME
Positive
It’s worn and broken but please give it to someone else who will have good use of it.
I would be sad .I have a home for 3 weeks my water is going to off CANT pay my rent.But I her and child I have left
I would do what ever I can to help her
Okay
Goodbye
https://scontent.xx.fbcdn.net/v/t39.1997-6/398369152_1330556884242457_4756096331270496556_n.webp?stp=dst-png_p100x100&_nc_cat=110&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=a4uRuHm_5N0AX_OFmo8&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCzdnb3wY1PXdvQMMNt339NP0Gf052mj8k49xy7cYs6HA&oe=658AA9EC
Great
I gave them a Roof their heads
He will be eternally grateful and perhaps donate time or effort towards the place that treated him. I would raise funds for his complete care.
Thank you grandma
as long as I have a case
Proud
like ive helped
pretty good
Happy
Awsome
Stop
Good. Glad to help
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX8UzZ2e&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD_IOV9exaHI2DaRkAQ2zu7_JQLcHXIbeWuAC_Uuf6E-Q&oe=658BC68B
Grateful
I Did Do This
Emotional
That would make me feel great.
I can’t imagine the fireman not having insurance. That would be boogies.
Grateful and happy
Stop
I don’t have a grandchild!!!!
So happy I would cry
I would feel that I brought some justice into this world where it is sorely needed. Refugees do not need to be tormented by bureaucracies, they need HELP.
I use food banks
I would feel grateful and happy
stop.
Stop
Pretty good
It probably would make me feel good
FUCK OFF. You are obviously ad driven.
I’m indeed a good person And I will feel great
It would make me feel sad for the dog but happy that the dog is taken care of. I would be anxious because I’d be worried Lucy might be scared in her new home.
Sounds like a scam
Wat response
ok
Happy
I already took it. It is too bad this is only seen by an AI Bot who doesn’t seem to understand or care about my previous response
right, but the solution is not to clean up after, but prevent the corporations from making the mess in the first place
relieved to have made a difference
I just feel ok
Great
Good
Great
no
Happy
Awesome
Happy
It’s about time! I would be pleased
Would make me feel like I respected the woman and let Lucy be happy with a new family
Good
Ok
Good
That sounds pretty amazing
I don’t have money for that but if I did I would because I have a girl that got it
Stop
https://scontent.xx.fbcdn.net/v/t39.1997-6/409223428_880100687129032_7426432018502277293_n.webp?stp=dst-png_p100x100&_nc_cat=101&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=LFabz0W2y7UAX_JCiX5&_nc_oc=AQnvlWs--h8bSXLfIz7cvu-pDfCT68K6BXBaMoABTXqooN55zF8k94cfejiKCsXjK6sN-heFkY8_c_684Uxe1bRI&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCrjtkHoWDkrYWdXE2yQVlY9I3QuvXQyB5vgEiT85P3rA&oe=65906D68
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8_oXCM&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAqZJcvuSmykEUnt0DggHkWMF87zFc6ji68cJmInVwkiQ&oe=658FBB0B
great
I’ d imagine that fisicly was a good time for all random blessings to evolve and very interesting and very informative to all because I know not sure if I can help but I would try
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9jcRPc&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDsLFvjBQtW77Gl3ryplNhJEcKbgJdhYrScGQdk-X_ryg&oe=658FBB0B
That would make me feel like I matter
They would say to me: Do you know what you’re doing? I would feel amused. My response would be, this doesn’t aline with my field of expertise. Let me find someone who can help you.
Would be achieving my goals
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9upTog&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCo4r8nuRRhCUNutH28EKdRdzktEjIH5Za_ASLvuSjKUA&oe=658FBB0B
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9j62Zu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCFoeDcqFkZNlrC_I1kYY6KjNU2fHqQQu6xLqiot2eQKw&oe=658FBB0B
Thank mei would feel happy
Happy to have helped!
This would make feel incredible!
I think they would appreciate me for the work. And I would feel so released, happy and wish to help more people
stop
I would feel amazing knowing I’m helping someone care for her family like everyone should be able to
concerned
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8xE-Df&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC1Qw2CEgMUJ7WUS-2grqC9POHxQ4KzwKPbmWnMo3Ov0Q&oe=658FBB0B
Good
N/A
Pretty awesome
happy
I would feel like my giving was not in vain
Great
It would feel good
Or hers
Accomplished.
““I can’t imagine how challenging it must have been for you to uproot your family from your home to escape the conflict and then navigate through a settlement marked by violence and sickness. It takes immense strength and resilience to face such circumstances. I’m grateful that we could be a part of helping you and your family find safety and settle into a new home. Your courage and determination are truly commendable, and I hope that the support we provided has made this transition a bit smoother for you. If there’s anything else we can do to assist you and your family as you rebuild your lives, please don’t hesitate to let us know.””
Stop
Good
How could it impact our future?
Will I live?
encourged
Go away.
yeah thanks
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=101&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_J7efD&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCSDSnuPFkoM4doqkR_dMhwz3vxLS09BeMxI_HeILVWLw&oe=6597A40B
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8mBQgf&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAvAlwlNeLzLF7fG4SXu6eYGgxti58fuMH0M8Y-slgihg&oe=6591B54B
Great, if it wasn’t just a temporary fix
humble
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8HoqOV&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCQYkKm42yYlpsbucAaJdkmuuDIT-HcesSfssWi91RYhA&oe=6591B54B
Valued, making a difference,
Does this charity favor women making their own healthcare choices?
Good
GOOD!!!!!!!!!!!!!!!!!
don’t understand
Feel distracted wen answer this question.
This is a waste of time. Bye.
Ok
Please leave me alone.
Good
Proud
I would want to be anonymous
Thanking God for giving me the opportunity.
I would be very happy to know that I helped make them feel safe and secure.
Good
stop
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8SIvbb&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBZrknU-EpoRPozkqSuaCd-aw0tVHRlM-BzIctzGKDdVg&oe=6593AF8B
I would feel honored yet concerned for this young man
I currently donate to charities that incorporate clean water provisions along with other avenues to help them improve their lives, both physical and spiritual. I believe it’s not a one thing only solution.
I would feel very proud of what they do and how I helped.
good
They did not say anything to me.
Amazing
very happy and excited to continue the help
Incredibly happy and warm that the dog has been taken care of
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-JwAZr&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB5y0ys8EPkKSRnh5dLbmMmRaZDTwyupW6sTGYjj7t9ug&oe=6593AF8B
Of course it would make a person feel good
Amazing
0
I am just not interested in your question or in your charity. Thank you.
Great, that I may have some positive impact on a child
Humbled
would feel like I made a difference for someone
Awesome
Proud
Very well satisfied.
really fantastic did you read my excerp sir
It would make me feel good to no that they are well an not hungry anymore.
stop
Good
great
i want to retake the quiz
Like I met her #1 need
HAPPY
Okay stop
I would feel good knowing the children can read
Better and more to do. Is this a systemic problem due to our stratified economy and poor planning, attention, support by governmental entities.
I do things anonymously.
stop!!!!!
I’ve been there. And don’t want it to ever happen to US again.
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9ETfSM&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCcBTivq2n3AXNmiKsIf3GUHtCjqFln8lyclKNa4CIdMg&oe=6595A9CB
a trust fund for pets
I would feel good that i helped someone
like I made a difference
Strong, empowered
Not good
Thank you for the charity navigator
Great
extremely happy
I don’t choose charities for the recognition so my satisfaction would be in the educational aspect of the conversation.
It would make me feel about the same as when a former Shriners Hospital patient thanks me for his or her even though I had very little to do with it.
Comeon
Like I did the right thing
Worthwhile
I would wish it were true
good. but I feel strongly about other issues as well
Sad
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_qDVz1&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB2h6BMybhJBQ-lHsPYDJvC9d1TyivgEBVOM6P1aFpOng&oe=6595A9CB
Pretty satisfied
Like I did something good
I’d feel great.
As a formerly homeless person myself I would feel very grateful and happy to help
Fabulous!
Happy
Satisfied
Amazing
LIKE I AM DONE WITH THIS SURVEY <> THANKS !!
Feel gd and appreciating
I run a nonprofit charity and need advise .
I will thank God because is the sustainer in my life
Good
Ok
Good about it
  • Combining the free text responses from the opportunity and obligation arm into a single variable treatment_text. The table displays text responses in alphabetical order.
data <- data %>% mutate(treatment_text = case_when(
    arm_coded == "opportunity" ~ treatment_FR,
    arm_coded == "obligation" ~ treatment_RF,
    TRUE ~ NA_character_
))

data %>% count(treatment_text) %>% kable("html", col.names=(c("Treatment Text", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Treatment Text Count
2486
““Can I read TRUTH versus being forced to endure Indoctrination?”” 1
““I can’t imagine how challenging it must have been for you to uproot your family from your home to escape the conflict and then navigate through a settlement marked by violence and sickness. It takes immense strength and resilience to face such circumstances. I’m grateful that we could be a part of helping you and your family find safety and settle into a new home. Your courage and determination are truly commendable, and I hope that the support we provided has made this transition a bit smoother for you. If there’s anything else we can do to assist you and your family as you rebuild your lives, please don’t hesitate to let us know.”” 1
““I’m terrified, I can’t protect my little ones, we have nowhere safe to be… Or to go, we have lost everything”” 1
““Was it too expensive to help? Could you have done anything??”” It would make me feel sad of course but it’s not wise to have a charity thing using guilt and shame to motivate folks to want to donate, just saying. 1
““Will you please feed my child?”” I would feel devastated that I hadn’t already helped her 1
““teem”” with life not ““team”” 1
‘I’ was that woman… 2 different times. The first time was with my first 2 children. WE struggled, we saved we did without things, but never was hungry. Then….11 years later two (2) more children..same thing, same problems and someone always helping us, me as a mother…. Growing up my mother would ’hall us up to our local Salvation Army and we (5 of us kids) would prepare food trays. We LOVED it, WE respected it and we never, ever turned our noses up… THAT made us WHO WE ARE! Never knowing one day I would be the one that’s stood in line… Thank you and I was to help! Lead us…, 1
(You misspelled “teem.”) I don’t believe in guilt-based giving. 1
, 1
——- 1
-Relieved 1
. 2
. Like I wish we had a h 1
2
.sad 1
0 1
0leasr somebody help me, why did you leave me, why don’t you or anyone love me help me I’m hungry cold and in pain how could you do this to me all I wanted was 7our love and caring. I still love you please don’t leave me come get me 1
  1. Call my church group, which has excellent connections with government and private organizations that offer intermediate and long-term solutions.
1
1/ I have had this talk with my grandkids when I had trees planted 2/ We want on line we looked at what animals lived in the forest they even want to school and talked to the teacher about this and she did lesson on also 1
14in dick full of cum 1
5i wnt to people in need, especially family 1
8 d9nt know 1
:’( 1
? 9
??? 3
???????????? 1
A RESPONCE 1
A amazing 1
A better environment for the future generations. 1
A friend and loveing saport 1
A little edgy because charter schools take funds away from regular public schools so the problem in public schools only gets worse. 1
A ok 1
A single student? Guilty, but I don’t have much leverage to change their life. 1
AS if there is so much more that needs to be done. 1
ASPCA can help finding a home 1
ASPCA would do nothing to help Lucy. It’s an organization of lawyers and lobbyists 1
AWESOME 1
AWFUL 1
Absolutely Happy! Also proud of myself. 1
Absolutely wonderful and thankful. 1
Absolutely wonderful. 1
Accomplished and satisfied. 1
Accomplished and special to my grandchild 1
Accomplished well done 1
Accomplished. 1
Accountable for both Lucy and the lady. Happy to help. 1
Actually the planet’s biggest problem is overpopulation. Solve that ethically and everything else will fall into place. 1
Actually, 2 years ago, I started making (money) donations to pet-food banks in the cities where my brothers, son, & niece live, as their Christmas gifts! 1
Actually, a close friend works for Habitat for Humanity in our hometown, so I’d probably contribute to them instead. 1
Adequate - within my means 1
African Elephants are much more endangered. 1
Again. Not sure. Sorta ill @ this time. Thought process is not working well 1
Agonized 1
Ah ha! A scam! My Cousin told me to open it since he works for the Federal Cybersecurity commission. Don’t bother trying to to reach me back—he has your identity and figures youre trying to exploit the elderly like the scams. BTW you’ve been reported and won’t appreciate the outcome 1
All Full 1
All of my horses, cats and dogs are rescues. Always have been. I contribute to local rescues. So the old lady would get good direction and support. 1
All right, I get it. Thanks. 1
All the feels 1
All things work together for the good of those who love the Lord 🙏 GOD will work it out just Pray. 1
All warm and fuzzy 1
All warm and fuzzy inside, happy 1
Alont 1
Alot 1
Already give to charities 1
Already have a into the house 1
Already have too many 1
Alresdy something I think abvout. My annually donating to NRDS is about the future for others, not for me. 1
Alsum 1
Although I have not faced anything this frightening, I have gone through some incredibly difficult times and seasons and was so grateful for family and friends 1
Always good which is why I have supported and benefitted from for years 1
Am I supposed to write what I think the person would say? 1
Amazing 19
Amazing and an overwhelming warmth and happiness within my soul!!!! 1
Amazing that I can feed a family 1
Amazing that I could help. These folks are not invisible. They are entitled to a safe, clean and secure environment 1
Amazing, thankful, hope 1
Amazing. I’d love to help them. 1
An excellent opportunity 1
And 76 years old and I do as much as I can to make sure people get fed like dumpster diet I go talk to people about giving food to the elderly I get clothes and do things for people that maybe families can’t do but I’m getting old and I’m not being respected for it anymore 1
And also I would look into this for myself and my friends 1
And thankful that he got the help he needed and care 1
And what’s that Taylor 1
Angry 9
Angry and scared for her safety 1
Angry there is no help for her 1
Angry, frustrated and feeling powerless. By the way I already donate to this charity. 1
Angry, helpless, betrayed 1
Angry. 1
Anguish 1
Another charity please 1
Anvry 1
Anxious to help 1
Anyone with even a hint of compassion would feel terrible 1
Appalled 1
Appeal to emotion. Facts are enough for me. 1
Appreciated 1
Are these questions going to lead me to donate something right now. 1
Are you going to help or just watch? 1
Are you saying tell someone about this healthcare plan 1
Are you talking Palestinians, Ukrainians, 1
Argh 1
As I started out to see a smile on her face that there are people other than family that will look out for your and your childrens best interest 1
As a formerly homeless person myself I would feel very grateful and happy to help 1
As a long time supporter of feeding American and our local food pantry (33 years), I can say that providing the basic necessities of life to families is extremely rewarding. The difference between needs and wants is very real and graphic! 1
As an LGBTQIA mom to 2 LGBTQIA kids, it would make me feel amazing 1
As an ecologist, every day it is my mission to conserve and preserve all creation, so they will know Grandma did her best. 1
As if I could help with a simple donation that could go directly to helping them. 1
As long as there’s no White Savior complex involved, I’d be glad. 1
As long they are comfortable. 1
As though I’ve just eaten a hot pepper!! 1
Ashame about this 1
Ashamed 6
Ashamed and complicit 1
Ashamed and guilty 1
Ashamed that I did nothing for the elephants. I have contributed hundreds of volunteer hours to local wildlife rescue. But I could do more. 1
Ashamed, and angry at those who caused the pollution in the first place. 1
Ashamed. We have more than enough 1
Ask specifically how someone is making their animal happy. 1
Ask them what they love Todo talents and hobbies 1
Assimiong she said positive things, I woulf lovr it. I’d feel great. 1
At first I would be angry and then I would remember everyone has their own opinion. 1
At least the name 1
At peace 1
Aw 1
Awe 1
Aweful 1
Aweful cause i would want to give them food 1
Awesome 21
Awesome ! 1
Awesome 😎 1
Awesome! 6
Awesome!! My whole family knows how I am about all animals 1
Awesome. Thank you. Like a million bucks you deserve to be healthy and have a good life 1
Awful 38
Awful & Terrible !!! 1
Awful .. I would help 1
Awful I would not do that in the first place 1
Awful I’m sure. Will not want milk anymore 1
Awful and very sad 1
Awful if I am in a position to do something and fail to do it. 1
Awful look for another job he may qualify for 1
Awful that I can’t help 1
Awful, I would probably find them a place to stay, and if couldn’t I would take them home with me! 1
Awful-stupid-selfish 1
Awful. 3
Awful. I would make sure the animal had a loving home 1
Awful. I’d like to encourage people to provide for their pets after they pass on. 1
Awsome 5
Awwww. Would be great. Seeing foamy orange industrial waste pouring into and polluting the Cuyahoga River when I was a kid (in the 60’s) in Cleveland really horrified me. I used to imagine that if I had three wishes one would be to clean up all pollution. So, glad to hear about this effective charity. I’ll check it out. 1
BLESSED 1
Bad 47
Bad a little guilty 1
Bad and greedy 1
Bad because no one is doing anything about it 1
Bad cuz he helped us 1
Bad for them 1
Bad. Let’s take this up later. 1
Badly 4
Bas 1
Be there for them. Find out there Needs and try to to help them 1
Because ASPC endorse the animal shelter at Charleston, WV. That place is a disease pit for dogs and cats, they don’t disinfect enough. They make it look pretty but it stinks awful. The conditions inside their nursery would appall a World War I doctor. Evidently, they were stealing the disinfectant wipes and spray I was sending them for personal use. The Fixem Clinic is a discount animal animal hospital in Charleston, WV. I donate monthly to. They saved my buddy Theresa 1
Because I have limited ability to help except with money, I could not actually help by taking him there. I would give money and hope others could help physically. 1
Been there before 1
Been there done that 1
Been there done that ! 1
Been there for awhile now. 1
Been there had to relocate for employment. 1973 1
Been there many times myself and get the Sr box every month 1
Been there, done that, doing that. Just need to bump up to community planning. Thx and goodby 1
Believe in God, everything is possible 1
Belinda 1
Bereft 1
Best person every that would be glad and happy to help in which ever way possible as long as I can and they allow me to help change things in a better way 1
Better 2
Better and more to do. Is this a systemic problem due to our stratified economy and poor planning, attention, support by governmental entities. 1
Better but not the best 1
Better imagined 1
Better. 1
Blank 1
Bless 1
Bless you it would add joy to my heart 1
Blessed 16
Blessed that I could help. 1
Blessed that I have the funds to be able to help 1
Blessed to have been able to help 1
Blessed to know that someone was eating 1
Broken hearted 1
Broken hearted. 1
Buddy I talk to my aliens all the time we got it going on 1
Bullshit. The ASPCA is horrible CEO Matt Bershadker makes nearly $1 million a year–$881,785 in base salary and $108,740 in benefits. That works out to $424 an hour for his salary. Other top executives earn huge salaries of $468,538, $420,613, and $385,415 (and more). Overall, 259 individuals earn at least $100,000 in compensation. The ASPCA has about $11 million offshore in the Caribbean. The ASPCA gets a “C” grade from CharityWatch, which calculates that 42% of the ASPCA’s budget is spent on overhead. 1
But I’d like to help 1
But have I also relieved or prevented sufffering? 1
But what about Greenpeace? They seem really cool. 1
Buy the food 1
Buzz off. Your survey sucks. 1
By the time I have grandchildren I will be dead my daughter’s only 5 years old I am 65 1
Bye 3
Bye bye 1
CANCEL 1
CEO MAKES TOO MUCH 1
CEO gets too much money 1
CONCERNED 1
Call you heartless & feel like you don’t really care about th e animals but just want to be acknowledged as someone who cares but didn’t want to did the work. 1
Can I do this again? 1
Can I make another choice? 1
Can I start over? 1
Can I start the quiz over? 1
Can I take the quiz again 1
Can barely feed me 1
Can you help us? I would want to put them in touch with knowledgeable help. 1
Can’t imagine but find your quiz missing the thing that always stops me from giving: the CEO’s salary and take home pay. 1
Can’t leave them there have to find a shelter 1
Can’t you help us a little. Why wouldn’t you if you can? -I’d feel guilty and ashamed. 1
Cancel 3
Cancel. Not interested. No more messages please 1
Cancer make me feel stressful 1
Can’t 1
Can’t help don’t have too much income 1
Can’t you help us 1
Cared for 1
Caring 1
Cautious 1
Change your testing to listen to what they want . 1
Changed my mind 1
Charity Match Quiz! 1
Charter schools are rife with mismanagement. Yeah, that tracks. 1
Charter schools are taking funds away from those public schools, making the situation even worse 1
Chatbot I’m a very different breed of men and really don’t like publicity. Whatever I do, I normally do it in anonimous way, because I’m not looking for glorifying or anything so please remove me from the list of participants. Thank U much 1
Child - this makes me sad. Me - it makes me sad too. Let’s see if we can help save the ocean. 1
Child might ask why this is important. Answer: because polluting water means a great many people are affected. Bad water can bring disease. 1
Child should be drinking plant milk! 1
Children and food 1
Close to her and hoping she will inspire others. 1
Cold 1
Come with me 1
Comeon 1
Communication is the Key as well as coming to a conclusion on things some of the questions that I answered all of the have an explanation behind the question 1
Compassion. Empathy. And hope for his future. And some suggestions 1
Concerned 4
Concerned and compassionate 1
Confused. I haven’t spoken to a child in years. 1
Confusing task 1
Connected 1
Conservation requires money, legislation, leg work & skilled media staffing - other than telling others about Rainforest trust ( Which is not heard of till this survey) giving $ is the best we can do 1
Contact Samaritans Purse 1
Content 1
Content and happy 1
Contented and joyful 1
Convicted 1
Cool 2
Cool grandma. That I’m teaching how to love and save all animals. 1
Could be any number of things. 1
Could we end this conversation please 1
Cow’s milk in stores is not from cows who had extra. It’s from cows whose calves are taken away so people can have it. That’s what I’d tell the child. I’d hope that child won’t want to drink it any more. 1
Crappy 2
Curious about how they are coping with a culture so different from the one that they are used to. 1
Curious about your database 1
Dad 2
Decline to answer 1
Defeated 1
Defeated and sad 1
Delete 1
Demoralized. 1
Depends on the content of the book that is provided. I would be strongly opposed to content that conflicted with basic, core scientific truth such as there are only two genders, truth exists and stands independently from belief, etc. 1
Depends on what they say 1
Depressed 3
Depressed and ashamed 1
Depressed however happy to be inside and warm 1
Desperate 1
Desperate to help 1
Desperate to help him/her 1
Determined 1
Devastated 2
Devastated for him 1
Devastated. 1
Disappointed 3
Disappointed and heartbroken 1
Disappointed in myself 2
Disgusted 1
Disgusted, terrible 1
Distraught 1
Distressed 1
Do my best to help find housing 1
Do they accept trans people? 1
Do they operate in my local area? 1
Does it charge anything, what do I need to do? 1
Does that exist? What is my charity match? 1
Does this charity favor women making their own healthcare choices? 1
Doesn’t feel like the right fit. 1
Doesn’t surprise me. I already support SPLC. Thanks! 1
Doing nothing would make me very depressed. In all likelihood, at minimum, I would have given this mother some cash and/or a ride to a motel/hotel. 1
Don’t care 1
Don’t know 5
Don’t know what to say 1
Don’t know yet 1
Don’t like the question. 1
Don’t want to go any further 1
Don’t worry, things will be ok.Keep your little one’s safe fed and warm. 1
Done 1
Done. 1
Dont know 2
Don’t care 1
Don’t have an answer 1
Don’t understand! 1
Dreadful. 1
Dude idk I just want to know about the charity 1
EMPTY 1
Eager to do more 1
Eager to go elsewhere, as I cannot solve their problems 1
Ecstatic 1
Ecstatic ! 1
Ecstatic and relieved 1
Effective 2
Eh🤷🏻‍♀️ I probably won’t have grandchildren so that doesn’t resonate 1
Elated 1
Embarrassed 3
Embarrassed and saddened 1
Embarrassed and uneasy. 1
Embarrassed, then excited that I could help. 1
Embarrassed. 1
Emotional 2
Empathetic 2
Empathy 1
Empathy sadness and a want to help them find an organization to help them 1
Empowered 2
Empowering 1
Encouraged, hopeful! 1
Encouraged, satisfied 1
End 4
Enjoy 1
Enjoyment because of it 1
Enlightened 1
Even stronger and more determined 1
Ever one need to how to read 1
Everyone should be covered and 1
Everyone is entitled to fresh water. 1
Everyone would be eating for they learned how to achieve all of the items and still have some to share. 1
Exactly 1
Exactly what I wish to avoid 1
Exasperated, disrespected, dismissed 1
Excellent 3
Excited 3
Exciting 1
Exit 3
Exit chat 1
Express that no one cares. I would feel hopeless and lousy. BUT Catholc Charities and the Red Cross would be a good place to start and an immediate need can be met with various shelters. 1
Extremely bad 1
Extremely frustrated 1
Extremely sad 1
FANTASTIC 1
FUCK OFF 1
FUCK OFF. You are obviously ad driven. 1
Fabulous! 1
False 1
Fantastic 4
Fantastic 😍 1
Fantastic!! 1
Fearful for them and thankful that i could help but currently i cant. I dont even have a cash credit card 1
Feed them 1
Feeding America and my local food bank are two of my charities already, so good match for me. 1
Feel Good 1
Feel amazing 1
Feel bad 3
Feel bad 😔 1
Feel better too helpthen 1
Feel distracted wen answer this question. 1
Feel gd and appreciating 1
Feel glad I could have helped 1
Feel good 1
Feel good to assist others 1
Feel good about it 1
Feel great about it 1
Feel hopeless and anger towards our systems that puts people in these situations 1
Feel like I have helped 1
Feel like crap 1
Feel sad 1
Feel so happy because l was able to help a mother that really needs some one to solve her problem and it is gift from our Lord 1
Feel terrible 1
Feel very bad, was let go at my employment. Adopted 2 grandkids sulation is finding the differenc agencies who helps. U how to apply all to places that help. No time to feel sorry for your self 1
Feel very badly. 1
Feel very fulfilled 1
Feeling better 1
Feeling like I’m doing this to help with those who are truly in need. 1
Feeling very sorry for no food 1
Feels great 1
Feels like you’re trying to manipulate me using my feelings. Not my idea of a smart thing to do. 1
Fight to find insurance or free care. 1
Find another job 1
Find it a loving home 1
Find out a little more about her and how she came to be in the situation she’s in and work from their making sure that her and her child have plenty to eat and are well taken care of! 1
Find the person responding for throwing brick through window and why; then go from there. 1
Finding a safe place is the most important, after we do that we can find food. 1
Fine 3
Finished - please stop 1
First doctor’s can,t save you it in God’s hands 1
First I would do what I could to help the lion 1
First of all I would d find a new owner for the pet. 1
First of all I would try to help even dough iam in the same situation myself 1
First of all sympthize with him and relate in short version how you came through & where they might go for help if you have any to share. 1
First of all, I don’t know a kid, except the ones that live on a diary farm that even know where their milk comes from. 2nd, cows are working animals, so I am not interested in that area, My concern is dogs, cats that come from a lab and are used for testing. My dog sitting right next to me right now was a rescue and has many issues because of the way she was treat and abused by her family. That is my concern 1
First of all, I would probably empty some of my pantry for her. I might possibly take her grocery shopping or buy groceries for her anonymous. 1
First of all, I would try to help them and if I had a place of my own. I would let them stay there for the night or help them find some Shelter. 1
First, I always help people I know who need food 1
Flawed premise. 1
Food and money is good felling 1
Food and physical safety first 1
For starters I would tell her to do what II-anti racism-anti-patriarchy folks do—join Black Lives Matter, read Caste, the Cross and the Lynching Tree, New Jim Crow, take road trip on Civil Rights trail, , insist on Critical Race Theory bing immersed into educational curriculum, support her local community organizations such as United Community Centers in east NY. 1
For the third time, I’m not using your charity. Please do NOT contact me again! I’ve given my answers! 1
Forget it-sorry I even tried to do this. Very limited charities! 1
Fortunate 1
Frustrated 7
Frustrated and helpless 1
Frustrated and sad. 2
Frustrated that we are making individuals pay for healthcare instead of the government and framing it as a feel-good story. If he suffered smoke exposure on the job, serving his community, and can’t afford healthcare that’s a major problem. The story makes me angry and we need solutions, not jsut community funds, though those are important in the short term. 1
Frustrated. 1
Frustrating 1
Fuck all the way off. 1
Fuck off 1
Fuck you 1
Fulfilled 11
Fulfilled - like I made a true difference 1
Fulfilled and filled with love and pride 1
Fulfilling 2
Full of love and life 1
Full of pride. 1
Furious 1
G 1
GC: I’m glad you did everything you could before it was too late. Me: I knew if the world became uninhabitable for humans, nothing else would matter. 1
GOOD 2
GOOD!!!!!!!!!!!!!!!!! 1
GREAT 3
Gee, your not going to guilt me into giving are you? 1
Get to the end pleade 1
Girls a lot of what men say isn’t true it’s what their egos like to believe. They say things like girls can’t do this and girls shouldn’t do that but in fact we can and we do. I’m an architect I should know. My field is male dominated, but women thrive in it, and ALL STEM fields. We live in a modern world today. A modern world where girls and women can do whatever they set their minds to. Courage and the will to succeed are all you need. 1
Glad 2
Glad I could be able to help 1
Glad I could help… but about more nights? 1
Glad I helped 1
Glad and grateful 1
Glad and sad at the same time 1
Glad but wanting her in a more permanent solution 1
Glad for their safety out of the elements 1
Glad that I helped, and thankful that I had the means to help. 1
Glad they are safe 1
Glad to do it.But, you didn’t give me a place to type it. 1
Glad to have been helpful 1
Glad to help 1
Glad! 1
Glory be to God! 1
Go ahead and do it 1
Go away 3
Go away. 1
Go back 1
Go now 1
Go piss up a rope. 1
Go to the chatity 1
Go without food 1
God Bless you and be safe 1
God bless you I am 79 and have Parkinson’s and other issues. I carry bottles of water in my car and large baggies with snacks, socks, wet wipes, and $5. I am on a fixed income and have difficulty paying utilities to my house. No one should be homeless in the United States 1
God help them 1
God help this lady 1
Good 181
Good I grew up with a brother afflicted with cerebral paulsy. 1
Good - but prefer to help children 1
Good Bye 1
Good about it 1
Good about myself 1
Good and blessed. 1
Good and useful 1
Good but I’m too old 1
Good bye 3
Good bye have a good day 1
Good bye! You don’t read my answers! 1
Good happy 1
Good if I could help 😀 1
Good if he/she had a plan on next steps 1
Good inside 1
Good inside. 1
Good luck 1
Good n somewhat worried 1
Good night to you all 1
Good that they are finally able to move forward 1
Good to know 1
Good — but right now I’m giving to Doctors Without Borders, Donors Choose, Audubon, and Cornell Lab of Ornithology. I just don’t do well with multiple choices where I can only choose one. 1
Good 👍 2
Good! 3
Good! Thanks. 1
Good, but I don’t want to give just money. 1
Good, but like I was applying a band aid. 1
Good, helpful 1
Good. 6
Good. Glad to help 1
Good. I had hoped to help marginalized women within the criminal justice system. 1
Good. I want my pet taken care of 1
Good. I. Like. That. It. Will. Be. A. 2. Way. Street 1
Good. It would make me feel good. What does that have to do with cancer? 1
Good. relieved to know such an organization exists for when I get older and wonder about what happens to my animals. 1
Good.😌 1
Goodbye 4
Goodnight 1
Good… I’ve heard of them 1
Got it. I will give this a lot of thought 1
Got it. Thank you. 1
Got the answer I was looking for. Now I’m checking out the recommended charity. Don’t need any more questions 1
Government can help but teaching them not to rely on government all the time. They become lazy and un appreciated 1
Gr8 1
Grandchild? 1
Grandma, this was all going away, and you helped to save it? 1
Grateful 18
Grateful and sad 1
Grateful I could help 1
Grateful I could help. 1
Grateful I was able to help. 1
Grateful and happy 1
Grateful and happy! 1
Grateful and humble 1
Grateful and humbled 1
Grateful for being able to help 1
Grateful for healing and the fou6. 1
Grateful for their rescue 1
Grateful that I could help 2
Grateful that I was able to contribute. 1
Grateful that I was able to help 1
Grateful that I was able to help. 1
Grateful that Lucy was safe, and that the lady had peace of mind. 1
Grateful to be able to help 1
Grateful to be able to help. 1
Grateful to be of service 1
Grateful to have helped 1
Grateful to have the resources to help 1
Grateful to play a small part and sad he had to go through that experience 1
Grateful. 1
Gratified 11
Gratified in my being there to help plentish the need for food! 1
Gratified! 1
Gratified, but I don’t need to hear anyone’s personal thanks… just want to know that I’m helping 1
Gratifying 2
Great 82
Great BUT I have never heard of this charity 1
Great all they need is love and taken care of mine are like my kids ❤️ I feed coons and cats ans deer 🦌 every night. 1
Great amazing 1
Great and happy 1
Great but l don’t have it to give I need help 1
Great but now I need to sleep 1
Great but what about food 1
Great idea how do you know unless you try 1
Great knowing they was safe 1
Great ¡!!!!! If I only could!!!! 1
Great 👍🏾 1
Great! 12
Great! Especially if it were in large print or braille so ALL readers can access reading opportunities 1
Great!🥳 1
Great, 1
Great, I made a change for people 1
Great, especially since I already donate to the NRDA monthly. 1
Great, if it wasn’t just a temporary fix 1
Great, that I may have some positive impact on a child 1
Great. 2
Great. I already donate to this organization 1
Great. I have given before 1
Great. Like I did something that mattered 1
Greatest 1
Greatful 1
Greatful that I could help 1
Grief 1
Guilty 23
Guilty and angry that she’s had No clean water 1
Guilty and full of despair 1
Guilty and sad 1
Guilty as can be. 1
Guilty of course 1
Guilty! 1
Guilty, although I am not the one destroying them. 1
Guilty, ashamed 2
Guilty. 2
Guilty. Sad. 1
HAPPY 1
HELPFUL 1
HIAS is supportive of Zionism and refuses to help in Palestine. HIAS is in no way for me, as they are perpetuating that slaughter. 1
HUMBLY GREATFUL TO HELP 1
HURT n UNFAIR N GO NACK N HELP HER WITH CARRYING HER STUFF N BABIES N BRING HER HOME TO FEED HER N GIVE HER PLACE WARM TO SLEEP N LET THEM STAY UNTIL SHE THE MOTHER CAN GET BACK ON HER FEET N ID HELP HER 1
Happens all the time. Can’t let my heart break 1
Happy 84
Happy feeling like I mattered 1
Happy I could help 1
Happy and blessed 1
Happy and content 1
Happy and content.🥰 1
Happy and empowered 1
Happy and excited that they were able to learn something to help theirself 1
Happy and fulfilled 1
Happy and useful. 1
Happy and very good 1
Happy because I have been there 1
Happy because I was able to help a moth and her child have a warm, safe place to stay instead of them being in the streets. 1
Happy for them. 1
Happy knowing I can help and give hope to someone 1
Happy that I can make it difference! 1
Happy that I was part of saving it 1
Happy that I’m helping make the world a better place. 1
Happy that Lucy will be taken care of… 1
Happy that it also rained to help the crops grow! 1
Happy that one night’s problem would be solved, but worried about the rest of the night’s ahead. 1
Happy that their need was actually met— not just talked about 1
Happy that they were able to settle into a warm home. 1
Happy to be able to help put lady’s mind at ease and find home for pet 1
Happy to have contributed to making a positive difference in someone’s life 1
Happy to have helped! 1
Happy to help 1
Happy 😊 1
Happy! 1
Happy, proud that I could help in my small way. 1
Happy, successful, ready to help again 1
Happy. 3
Hard to imagine but probably ready to take her in and fix all her problems more for the child than her 1
Hard to say because I don’t have children 1
Hate the killing for profit!! 1
Have donated to Amnesty for over 50 years,. 1
Have given books away when teaching years ago. 1
Haven’t thought that far since just heard of this 1
Having been a social worker and a therapist I know what I would say or not say 1
Having been a teacher in this situation, I cannot tell you how wonderful an experience it is when a child learns to read and how sad it is when they are unable or unwilling to try. 1
Having been a teacher, it saddens me. But to know the teachers are willing to subsidize their classroom projects is what teaching is all about. Or what it should be. Teaching involves supporting the students. And the teachers I have known are first to make sure their students have what is needed. 1
He approach me and ask me that she benefited nowhere to go I would ask her if she needed a place to go if I had one I would most definitely give her one and make sure she was safe for me I would never throw anybody here or turn them away 1
He might ask for help for his family and I would find an organization that sould help him. 1
He might say thank you, and I would feel humbled yet happy that I had the privilege of helping them. 1
He should have health insurance before going in for duty 1
He will be eternally grateful and perhaps donate time or effort towards the place that treated him. I would raise funds for his complete care. 1
He would be grateful and I would feel pleased that I had made a small contribution to a better world. 1
Heart broken 2
Heart broken and helpless 1
Heart broken for him 1
Heart sick 1
Heartache 1
Heartbreaking for me when I see homeless people in my community I try the best way I can to reach out! Do something instead of nothing! 1
Heartbreaking!! 1
Heartbroken 6
Heartbroken 💔 1
Heartsick 1
Heavy on the emotional manipulation aren’t you? 1
Hell no 1
Hello how are you 1
Hello?? I don’t feel comfortable 1
Help 2
Help it isgoing to rain tonight. Thishappened..after l wenttoa nite meeting. Was raining. I drove by…didnothing. about 30vyears ago. 1
Help me 1
Help me read 1
Help then 1
Helpful 9
Helpful & fulfilled 1
Helpful and good for them good 1
Helpfull 1
Helpfull. 1
Helping her go to school might make her feel empowered. What can I do to help you feel safe to travel to school? 1
Helping humankind is important. I’d check myself to know what I could do the do it. 1
Helping the least of these is what Jesus calls us to do! 😊 1
Helpless 21
Helpless and Frustrated 1
Helpless and angry 1
Helpless and inadequate 1
Helpless as I don’t have much money to donate. 1
Helpless as I wouldn’t have an answer 1
Helpless, and angry 1
Helpless, frustrated, depressed, angry 1
Helpless, frustrated, guilty 1
Helpless. Frustrated. 1
Here’s the thing… I have already given to NRDC and other, similar charities. So I’d have to tell those kids I tired, I helped, but maybe I could have done more. Or maybe the problem exceeded the reach of any organization and could only be solved by Nations, who decided to do otherwise. 1
Hey I help out in my neighborhood help feed the hundred people home work anything I can do to help me and a friend of mine takes two to Grandma for you that’s all I can do thank you and I’m so sick I can actually thank you 1
Hey this quiz is cool but please don’t play the emotional manipulation card by asking me how I’d feel providing clean water to someone probably dying from toxic water. No shit it’s the right thing to do! but I was in a good mood before starting this survey, I didn’t come here to be vividly reminded of the atrocities on our planet. 1
Hi I’m 8 years old 1
Honestly, I would feel like crap; no one should have to thank me or anyone else for having their basic needs met. People shouldn’t need to imagine an interaction with the recipients of philanthropy in order to participate in the act of joyful giving. I think that this mentality only furthers the otherization of the people nonprofits serve. 1
Honestly, I would take the animal into my own home to care for it until their time comes. 1
Honey, I have seen it all in my lifetime. My first job was interviewing potential tenants of low income housing. My next job was interviewing candidates for entry level office and factory jobs at Reynolds and Reynolds. As we know our own lives can also have a few hard knocks at times. It’s been nice talking with you. Thank you. 1
Honored 3
Honored. 1
Hope Lucy finds a goog loving home 1
Hopeful 6
Hopeful and happy 1
Hopeful for her and her family 1
Hopeful for their future 1
Hopeful, and proud. 1
Hopefully for future generations to have the knowledge to find solutions to other big problems. 1
Hopefully like I did something that matters. 1
Hopefully they would say thank you for making my world cleaner. I would say it is my gift to all of your generation. And to the animals who had no say in the matter. 1
Hopefully they’d be grateful, and I’d be happy I made a difference 1
Hopefully, they would say ““Thank you”“, and I would say ’You’re welcome”” 1
Hopeless 3
Hoping that it’s true.  1
Horny 1
Horrible 35
Horrible ! 1
Horrible & helpless 1
Horrible ,empathetic , and eager to help 1
Horrible I would do my best to find them shelter. 1
Horrible and responsible 1
Horrible really horrible 1
Horrible, I’d get some garbage bags and gloves and ask my grandson to help me clean.maybe we can’t do it all.. but it’s a start 1
Horrible, but if I didn’t have money to give, I would explain that to him, too. 1
Horrible, guilty. 1
Horrible, like I’m betraying Lucy 1
Horrible. 1
Horrid. Then I would try to find someone like a TSA or Air Marshall – an aurthority (sp) to help 1
Horrific 1
Horrified 1
Housing Matters is an excellent organization but I was looking for something that is more grassroots 1
How I feel depends on what the imaginary person said 1
How about helping the sick that is rigt on top with this 1
How can I be most helpful? 1
How can I be of use? 1
How can I best help? 1
How can I help you 1
How can you help me? I would feel involved. 1
How could I say 1
How could it impact our future? 1
How did this happen? 1
How do I donate 1
How do I opt out of this conversation? 1
How is it possible, they’d say 1
How much is this going to cost me now your answer will dictate how I’ll feel 1
How much will it cost me 1
How they grow up an 🙏 everyone an everything 1
How very, very grateful that Lucy will be taken care off when she passes.

It would make me feel so warm and happy to know that this sweet lady can transition knowing her precious Lucy will be well cared for, and not “another statistic.”

I love helping people, and I so very much love dogs and cats. I just get so sad when I see stray dogs.
1
How was I to be able to stop it I’ve never been there or out of the us 1
How would it make me feel if I knew there were veterans missing limbs or who have PT 1
How would this make me feel? 1
How would this make you feel 1
How’s my life gonna become in 2024 1
Huh?? 1
Humble 7
Humble grateful 1
Humble that I was able to help her in her time of need 1
Humbled 10
Humbled and happy I could feed her and her children 1
Humbled and thankful 1
Humm 1
Hurt 2
Hurt for them and sad for them and if have I a help them too. 1
Hypocritical 1
I really love kids I got 4 of my 2 grandkids I try to teach them the right thing in life ok 1
I volunteer a lot because it keeps me humble and reminds me that even the best people can fall on bad times. It has nothing to do with how I feel. 1
I AM an old lady who worries about her pets, silly you. 1
I AM that pld woman with a dog on her lap…worrying 1
I Did Do This 1
I LITERALLY told you I wanted a cause in the US 1
I WILL HELP EVERYONE IF I CAN AMEN. THANK YOU HEAVENLY FATHER, THANK YOU JESUS. AMEN 1
I WOULD BE HONERD .I WOULD BE PROUD TO BE PART OF SUCH A GAMECHANGEING RESPONSE ABILITY 1
I WOULD BE VERY HAPPY TO HELP SOMEONE IN NEED, I GET HELP MYSELF.. 1
I WOULD FEEL GOOD HELPING THEM WITH THEIRSICKNESS THAT IS LOVE 1
I WOULD LIKE TO HELP 1
I WOULD TELL THEN NO ONE ESPECIALLY CHILDREN DESERVE TO GO HUNGRY BCOS WHEN GOD CREATED THE WORLD HE MADE ENOUGH FOOD TO KEEP EVERY ONE FED NO MATTER WHAT HE FEELS ABOUT HE FEELS THAT HE CREATED IN HIS IMAGE AND LIKENESS WHICH IS LOVE ABOVE ALL THINGS 1
I WOULD TRY TO FIND HER PLACE 1
I absolutely would do something. If I couldn’t take the animal in, myself, I’d help find it a home. 1
I actually already gave to them as a birthday celebration activity this year. And it feels great. I’m proud of my choice. 1
I actually don’t know 1
I adopted a 12 year old dog whose owner died. It breaks my heart to see animals abandoned or separated from their families. I support the LASPCA and Take Paws Rescue. I have 2 rescue dogs. 1
I agreed to take a quiz, not to write some inane essay on how someone else would feel if I did or didn’t give to a particular charity. Sorry. 1
I ain’t want Adam thing out of pe 1
I already am an ASPCA guardian, so I’m already helping the old lady and her dog. 1
I already belong to the ASPCA 1
I already care for folks in need as a pastor. I have cared for many people over my career. 1
I already contribute monthly to Mercy for Animals, and I give more than I can afford to. 1
I already do that now. The only difference is that it is the elderly that I help 1
I already do this. I am a retired teacher and think we must take care of the earth in order for man to survive. Everything we need comes from the earth. Mining hurts the earth and takes quality of life away from the people and animals that need the producers to survive. Taking care of the earth provides for all of mankind and every animal species. 1
I already donate regularly to NRDC! 1
I already donate to TP 1
I already donate to this organization, thank you. 1
I already give monthly all I can afford to Tunnel to Towers. Can’t give anymore! 1
I already give to ASPCA 1
I already give to Israel thru Church of God 1
I already give to SPLC! 1
I already give to children in other countries 1
I already give to several wonderful charities that help elephants. I saw a vehicle for this charity in Thailand. Thanks for the reminder - I will give to them. 1
I already give to them! 1
I already have checked out the organizations I support but was just curious what the program would say. The problem is I don’t see the needs of the world so narrowly. 1
I already help and want to help but do not like guilt and emotional tactics 1
I already know. I volunteer with a homeless organization 1
I already participate in a program in my community to help people like her. 1
I already participated in my granddaughter s games. 1
I already set something up. I chose two families. They both said yes. One family is the family who gave her to me. The other is just husband and wife who loves cats. They have two right now. 1
I already sponsor 3 children through Compassion, work with Habitat for Humanity and contribute through the ELCA to support emergency care where it is needed most because I know 100% of my contribution goes where the need is. I sponsored the children so they are able to get and education, Habitat because I believe everyone should be able to have safe housing and my church because I trust their ability to use my money where it is most needed, like right now some of my money is supporting Palestine. 1
I already sponsor both economically and volunteer hours refugees through The Episcopal church and our local Interfaith Ministries of Greater Houston. I don’t know about HAIS but will check into it. 1
I already support the ASPCA. 1
I already took it. It is too bad this is only seen by an AI Bot who doesn’t seem to understand or care about my previous response 1
I am 62 years old and I think about that often with my animals if something would happen so it’s due to my heart and close to my situation. Foster care is definitely an option. I would love to take into look into. I’ve been thinking about it for a while, I just keep praying and hoping that God will lead the way 1
I am a 3 time cancer survivor. My sister-in-law is fighting throat cancer and they can’t do anymore for her. This is devastating. I wish I had the money and knowledge to find a cure for people like her. 1
I am a Christian I believe in prayers and they won’t really work 1
I am a caregiver already 🥰 1
I am a old women that has a dog 1
I am a pastor of Christian faith Ministry and we have food outreach and much more 1
I am a retired middle school teacher who taught students from inner-city neighborhoods. I plan to look into Girls, Inc.  Thank You!!! 1
I am a retired special educator. It would break my heart. 1
I am a single mother of two my with no help help from any body please pray for me o need help for please to stay my rent is sky high 1
I am a special education reading teacher, I know where this sad fact is real 1
I am a teacher, so I might be too close to the issue. 1
I am about to tell you to go fuck yourself 1
I am already a long term patron 1
I am already a volunteer for feeding America. 1
I am already familiar with helping people in dire situations - I always help 1
I am already supporting such a group.🥰 1
I am alrready sponsoring a young man & putting him through college. 1
I am an action problem solver and also safety conscious and I could NEVER WALK AWAY NO MATTER IF ALONE OR HOW I MAY ASSIST! OH I BELIEVE THUS IS A GREAT MSG YOU HAVE INSPIRED with in today! And fact I have no ties in this usa and blessed to have avmbility to go where want….thank you! How nay I jump into physical ha ds on acrion? 1
I am an animal lover so it would hurt me pretty bad to see an animal go to a shelter I’ve had when they went to the shelter and I lost her forever though I know it feels like and no animals should go into a shelter because if they’re there long enough but nobody taking them or adopting them they are going to get euthanized 1
I am assuming it would make me feel awful for them 1
I am concerned about all waterways and believing it a Crime Against Humanity to cause water pollution 1
I am concerned about older pets and their quality of life when their owners are ill or die 1
I am confused 1
I am confused by your choice… While I believe in rainforests these are not part of the continental US. Here I participate in Nature Conservancy, National Parks, Sierra Club, local land conservancy groups. I also am a big supporter of RedRover – the best animal group I have ever known… 1
I am doing water projects through rotary international and wonder if they’re an organization that you find yourself recommending at all. You can contribute to the foundation without being a member of rotary and they are highly transparent and respected organization 1
I am done thaks 1
I am done thank you good bye 1
I am done. Thank you. 1
I am finished with this “quiz” 1
I am full of sound and fury, but it really signifies nothing unless I stand up and support them in any way I can. 1
I am glad progress is being achieved in cancer research 1
I am good with it 1
I am grateful I’m safe for the night. 1
I am happy to look into this organization but I also believe christianity should be a HUGE part. 1
I am homeless and living in a shelter now 1
I am in her place right now. Me and my son don’t have a place to live. We are staying with family. But it’s not our place. 1
I am in hospice and please stop sending me these questions …. 1
I am in this position. 1
I am just not interested in your question or in your charity. Thank you. 1
I am more worried about Mom and her symptoms being ignored,. There are a ton of grants for AEDs, I have written 4 for soccer and cross country fields 1
I am more interested in protecting the old growth forests in the Pacific Northwest. 1
I am more interested in supporting members of the LGBTQ+ community, and seeking equality for all 1
I am much more interested in teaching children music and the arts but that was not an option. That omission makes this survey rather biased. 1
I am not interested on going further. 1
I am not interested at this time. Stop. 1
I am not interested in further conversation. 1
I am not sure 1

I am not sure what she would say… thank you or I hope this works .

I would pray for her…

My mother died of ovarian cancer.
1
I am not sure what they might say but I wold want them to know they are not alone. 1
I am not sure, I am a 71 year old retired registered nurse. I had COVID and I still have brain fog after about 2 and a half years 1
I am not the person to do nothing…I would be able to provide info on community resources. 1
I am on a very low fixed income by the way 1
I am one of those old ladies and have already made arrangements for someone to care for my pets if I should pass before they do. Hopefully I will outlive them 1
I am sending you because I need your help in educating my children 1
I am so happy for than 1
I am so happy that you are feeling better. You can go on with life now that you have received that treatment. I am so happy that I funded this treatment. 1
I am so sorry that I couldn’t post any sooner than I am. My computer acted up and never let me get back to you all till now. My friend and I started a reading program one summer and the kids loved it. There was this one girl that read at 5th grade level, but she did not comprehend what she read. Her twin was reading at 3rd grade level and she knew what she had read. I would love it to teach any child or adult or even grandma & grandpa how to read. Yes I know what is involed teaching an adult how to read. You see there was an 81 year old man that came in and asked if he could sit with our classes. I had the younger children from Pre-K to the 2nd grade, and my friend had from the 3 grade on up. We both worked with this elderly man that wanted to know how to write his name before he 1
I am so sorry. You should always feel safe and free to live your life, wherever you are. I am sorry I didn’t help you then, as I didn’t know what I could do, but I want to learn and I want to follow whatever steps I can to help, right now. 1
I am that mom 1
I am that old woman and I would not give he care of any animal to the scam of the aspca 1
I am that teacher in a private school classroom. 1
I am the helper of Almighty Shiva. 1
I am the kind of person that loves To see people happy and healthey. 1
I am the one that needs to know how to pay my rent 1
I am too tired too finish this programmed chat. 1
I am very active with the largest faith based food pantry in my area so this isn’t something I would do! I do not turn people who are in need and hungry away 1
I am very familiar with Donors Choose as I am a retired teacher and am very concerned that teachers have the funds to make learning fun and productive for the students. 1
I am wanting to help women abused by their partners escape from the abuse. 1
I am willing to help you but you have to prove that you are willing to help yourself and your family. I’m not just giving people handouts I’ve been down that road with other organizations where people don’t want to help they just want to take 1
I am worried about the same, and pick up trash when I walk the beach. The whole of the natural environment is at risk— as are we and all the animals! 1
I answered your questions, probably not the way you wanted to hear them answered. I will donate locally. And I quit answering yours after I explained that the CEO of the company you suggested receives over a million dollars in salary every year. My money does not go to places like that. 1
I answered. You don’t seem to have received it or this is automated and I disclosed much about myself you will never see. One more and last time: I am. Very very very old! Late 80s. Sparse income. Big debt. I can’t donate to any cause and there are many good ones. I help first graders at one school to grow their reading skills. Based on Maslow’s Hierarchy of needs, nutrition is number one. That’s physical survival. People who are educated can and should and often do respond to that need. Always there is poverty. A path out of poverty is education. This is simplistic. There is sickness and deformity and all manner of other hurdles. Education can work to relieve these. Education is basic to financial security. That is why I chose it. This is my second and last time responding. If I ge 1
I arrange for someone to tc of the pet before I pass 1
I asked for a US charity and you send me an African one. good bye 1
I be Happy to help her 1
I be welling to help her and child 1
I been 13 yrs of homelessness and meet people hopeless, distress, lonely, most of them by their choice, to be alone by thier self the one scary are people who toxic of drugs and alcohol, but every one of them have their own intelligence, i don’t have formal education the most i have is when i certified to get my english is a second language and learn to communicate in the world. 1
I can help 1
I can identify with both of these charities as I already give to each of them & also to a couple of horse charities. 1
I can imagine saying why did we come 2000 miles to pick up trash? 1
I can nit answer this question with a fr mind because I and my son and daughter will be homeless soon acctually evicted soon so I dont think this is rt for me 1
I can sleep tonight knowing my child is safe. 1
I can take her when your’re gone 1
I can’t do this now. I have to go out. 1
I can’t donate, I want to volunteer. 1
I can’t imagine 1
I can’t imagine helping him 1
I can’t imagine not doing something for this woman with child. I would take her to a food pantry or a grocery store and help her fill her cart with healthy food. 1
I can’t imagine that. My school age children and I were once homeless and penniless. Been there done that. Know the shame and desolation felt and the embarrassment to my sons among their peers and mine. Only a few were compassionate not even the family that took me in as a child of an unstable, umwed young mother in the 40’s. 1
I can’t imagine the fireman not having insurance. That would be boogies. 1
I can’t take responsibility for the great lawyers at SPLC 1
I cannot imagine a child without books. 1
I cant seem to get the app to complete my joining. It said my payment was accepted then later requested payment, and it seems to lock up when I try to choose a program. Maybe I need a human being? 1
I can’t I need help 1
I can’t imagine giving such a heartless response. I would assure the person that I would help her find a good solution that is best for Lucy. 1
I can’t imagine not helping this person 1
I can’t imagine this situation. 1
I chose to leave the chat 1
I clicked on 🔗🖇️ 1
I contribute to Orphan Kitten Club, Kennel Compares and Animal Humane of NM. I can’t support all 1
I could never imagine myself not assisting immediately to help fulfill those basic needs 1
I could not do nothing, that’s not me. I would probably take her home with me until we find a program to get her & her child in. I’ve done that before. 1
I could not just walk away not first know how I can help her 1
I could not see me not trying to her them in any way i could 1
I could not sit idle to watch it happen 1
I couldn’t do that 1
I couldn’t do nothing. I would do something. 1
I currently am actively involved with Kokomo Urban Outreach and I support them financially and actively with my time. 1
I currently care for my elderly mum and am looking toward the future. 1
I currently donate to charities that incorporate clean water provisions along with other avenues to help them improve their lives, both physical and spiritual. I believe it’s not a one thing only solution. 1
I currently visit my local supermarket and pay for groceries for indigent families. 1
I developed and directed a post bac certificate program at a local university to train statistical programmers for the pharmaceutical industry and place them in very highly compensated jobs. 1
I did a very small part in protecting this ecosystem. All I did was to stand up against the deforestation by my actions, talking to people and donating money to the cause. 1
I did other things. 1
I didn’t receive a charity recommendation. Just an exclamation mark. 1
I didn’t get the name of a charity. 1
I do appreciate you letting us adopt Lucy. Please come visit her anytime 1
I do donate to ASPCA 1
I do donate to Feeding America of SouthWest Michigan… 1
I do give as I can. I don’t think my grandchildren will be upset with me. 1
I do it on a more personal level 1
I do like the charity proposed. 1
I do more than I should and all that I can so good bye 1
I do not feel a direct obligation to do anything. The wording ““- and you do nothing to help her find shelter”” is somewhat odd. 1
I do not have, nor will I ever have grandchildren! I’m distressed that you would try to force your heteronormative way of life on me! 1
I do not like your agent…. He is a grouch 1
I do not need to imagine . I have already experienced this 1
I do not quite get your question 1
I do not want to respond you are harassing me 1
I do not wish to answer. 1
I do rescue work with cats at a local humane society 1
I do things anonymously. 1
I don’ tknow 1
I don’t 1
I don’t no 1
I don’t care 1
I don’t care what they say to me. I just want to know that I made a positive difference in her life. 1
I don’t donate for praise and would feel uncomfortable. 1
I don’t have a grandchild!!!! 1
I don’t have any children, therefore, no grandchildren to boast to. I want to eliminate all plastic waste from all the waters where all animals and birds either feed or live. I’m not into prettying up the beaches; let the people who go to the beaches do that. But in reality my favorite charity is me. As George Eliot wrote: One must be poor, to know the luxury of giving. Well, I AM poor and, besides feeding/clothing/housing myself, giving to myself in the short time I have left alive is the only luxury I can afford. I’m just the right kind of selfish because I know exactly what to give and where my giving will do the most good. 1
I don’t have children but it wouild make me feel fantastic 1
I don’t have grandchildren 1
I don’t have grandchildren - this is a painful spot for me - but I can imagine feeling good about the scenario 1
I don’t have grandchildren and I don’t trek, but I have relatives in India. 1
I don’t have grandchildren, but I care about our planet and people 1
I don’t have grandchildren, but theoretically I would feel like a traitor or hypocrite 1
I don’t have no one in the flesh. 1
I don’t have the money I knew it was a catch .but I do thank u for the reading 1
I don’t how I feel 1
I don’t know 11
I don’t know Good 1
I don’t know about that 1
I don’t know how I feel 1
I don’t know how I would feel r what to say to them 1
I don’t know if I was a man but I am not 1
I don’t know if I would engage her if I didn’t have answers to questions she might have. 1
I don’t know that’s why I’m asking you 1
I don’t know what to say 1
I don’t know what to say to him. I have never been in that situation. 1
I don’t know. 1
I don’t like the SPCA. There are much better groups. 1
I don’t like this kind of forced response and roll playing, it’s not part of picking a charity 1
I don’t need a response. Doing my little towards equity is just the right thing to do. 1
I don’t plan on having regrets because I do what I can to support good work 1
I don’t support Africa wild life 1
I don’t take in people anymore. Reason: cause I know from experience that everybody falls on hard times sometime. And I took in 100 people in my house over a5 year period. To help them get back on their feet. And ended up throwing 90 of them out. Cause they weren’t making an effort for themselves or wouldn’t contribute to the house. Like: help clean up, do some yard work, or go get a food box. So it doesn’t take long I see what they are doing. Nothing. 1
I don’t think I do 1
I don’t think every child should go to college, so that goal troubles me. I think every child needs a good, fundamental education and a path to a rewarding career. If that requires college, so be it. There are lots of very rewarding careers that provide both meaningful work and excellent pay and don’t require a degree. 1
I don’t think this is for me. I need help myself. But thank you 1
I don’t understand the wording of the question. I would recommend the young man find a different place with the sport or try a different activity. I would discuss the coach with the principal and advocate for a second team because even if that coach was reprimanded, he’s likely to punish the young man in some way. 1
I don’t understand what you are asking 1
I don’t want children because it’s bad for the environment. 1
I don’t want or need them to be personally grateful to me. 1
I don’t want to be acknowledged or talk to them. I don’t want to make them feel obligated to say thanks or be embarrassed that they are in need of help. I am homebound myself and often feel like a burden to family, friends so won’t do that to someone else. 1
I don’t want to be thanked–giving is its own reward. 1
I don’t want to donate to large animal charity. They already have a lot of money, and their top tear CEO are always making MILLIONS. 1
I don’t want to give to any charity with executive collecting huge salaries when there are organizations in my community that are 100% volunteer. 1
I donated to Feeding America and feel good about it 1
I donated to RIF 1
I done that 1
I dont 2
I dont care as long as the ones who need help get it immediately 1
I dont have one. 1
I dont listen to peoples’ words when i have decided to help 1
I don’t choose charities for the recognition so my satisfaction would be in the educational aspect of the conversation. 1
I don’t code, what else is available locally to assist one to one 1
I don’t have children or grandchildren, but I’m focused on all children who will feel the brunt of the climate crisis 1
I don’t have grandchildren 1
I don’t have grandchildren. I have lived in accordance with the concept of Zero Population Growth. 1
I don’t have money for that but if I did I would because I have a girl that got it 1
I don’t have to imagine. Imagine a young Jewish boy of 13 at sleep away camp in the South waking to a burning cross. SPLC is the perfect charity recommendation. 1

I don’t imagine what they would say; I realize it’s my human responsibility to help others.

I do think the survey is partial. I don’t think people generally decide if they should contribute to national or international programs but rather the donation is often in response to a specific disaster or unfair social norms.
1
I don’t know 2
I don’t know how to cook. I don’t have the tools. I would get the tools for her and cook the meal with her. And work out a plan for future lessons. 1
I don’t know just what to say right now 1
I don’t know my answer would be probably I feel probably good about it that I help that person with there dog 1
I don’t know, because there was no charity or person given 1
I don’t need a thank you, helping people is enough. Even if you never see the effect of your donations. 1
I don’t think being thanked is important but I would love to know I am contributing to making a difference. 1
I don’t understand 1
I don’t want a guilt trip, but thanks anyway 1
I don’t want any animal to be lost forever but I’d think the World Wildlife Fund would fit better. Right? 1
I don’t want the recognition 1
I don’t want to get to know them. 1
I don’t want to talk about it anymore. At work right now 1
I expect he might say thank you. I’d probably feel humbled that what ever little bit I had contributed had helped him from a circumstance that I can hardly imagine. 1
I failed 1
I failed when I could have helped 1
I feel I did a good deed 1
I feel I’ve let them down, and should try harder to find the solution for this problem. 1
I feel angry and sad that nothing I do to try to get others to understand the extremely dangerous nature of the problems at hand, and to turn around global warming before it’s too late. 1
I feel bad about police officer who loves to harassment black young person or people 1
I feel glad that I got to help save the dog and got the dog to loving people 💯 ❤️ 1
I feel good about it 1
I feel like I’m teaching an AI bot how to be more emotionally manipulative and that’s not great. 1
I feel like a made a difference 1
I feel overwhelmed that I can participate of helping someone that’s going through the tough times of cancer and battling the outcome to be supported with them through thick and thin the rest 1
I feel sad that they can’t afford medical care. I think everyone need health insurance to cover their medical needs. 1
I feel so happy about this. I’ve got a reason else for no no and educational. Keep up the good work. 1
I feel so happy and thank for giving a good heart of serving humanity in the world 1
I feel very. Happy that I made someone day 1
I find your survey to be a bit too narrow! I would feel obligated to help in that situation, but you missed the mark on my charity. There are others that are similar that I consistently support. You might try some “check all that apply” options in your survey! 🙃 1
I first off would always help someone in need so I can’t fathom this question 1
I fucking love that! :0 Rainforests are grossly deforested quite a lot. :0 I’d love to give back any way I can. :> 1
I gave story books to kids 1 though 6 yrs old 1
I gave them a Roof their heads 1
I give generously to Our LOCAL food bank because I know exactly how the money is used. It is totally run by volunteers so NO administration costs which I learned can be enormous and the “needy” are served honestly. There are charities that are “”bogus “ for lack of a better word. 1
I give money to Amnesty and write letters on their behalf 1
I give monthly to Feeding America already 1
I give now to special Olympics, do a car show for special Olympics and I work with people with disabilities 1
I give to Heifer International. 1
I go out of my way to prevent that from happening. 1
I googled rocket ship education. I’m more likely to give locally. 1
I guess I don’t understand the question. As a teacher, I know that many children are food insecure, and I feel yucky about it. 1
I guess it would make me feel like I accomplished something 1
I guess ok 1
I hVe no idea 1
I had a cat and she was a 💗 bug set right next to me in the recliner and purring licking my hand and sleeping 😴 on my bed right next to me and keeping the mice 🐁 under control I really miss her for Her name was Leah she adopted me then I know I gave her some food to eat outside the house when it was cold 🥶 in the mud room and she adopted me talk about a Love ❤️ bug she followed me into the house and would not leave until she had to go to the bathroom for she would let me know about that so I brought a cat box for her due to I live out here in the country were there are critters that would eat her quickly 1
I had a son that I was told that about. But by the grace of God he is still on this earth. 1
I had to run take care of my grandchildren . Sorry but will have to wait. 1
I have 30 yrs experience in the field. It would feel awesome to share information with the jobless 1
I have a 10 yr. Old blind poodle I just adopted & a 10 yr.old Chihuahua that I have had since a puppy & a 8 yr old cat . It bothers me that ASPCA is sitting with 3 million dollars in their bank account . I think they could make better use of their assets ‼️ 1

I have a bunch of ACTUALLY rare diseases myself - as in, less than 10k people worldwide with my disease. Have YOU done anything to fund research for ME?

(Side note, I don’t like being guilted into donating to a charity. I know this is partly for psychological research, so please note that MOST people will not like being made to feel guilty - most people get defensive, even if it’s in regards to something they would have otherwise agreed with)
1
I have a child with a ultra rare genetic disease that was just found within the last 6 years. I would support genetic research and families affected. I think this is a false dichotomy. My giving is going to be for rare genetic diseases. 1
I have a dog I would love to have someone to take care of her 1
I have a dog named Lucy whose future with a trustworthy friend is already a legal document. 1
I have a dream about my dog and my dog family will take care my dog 🐕 they all him 1
I have a fear of not having enough food for the family. I generally buy extra & give it to others & churches. 1
I have a negative feeling about this charity 1
I have a pet which is a dog an it makes me up set cos people leave or hurt there. Animals 1
I have a tesn 1
I have a way to help I’ll help 1
I have already discussed the likelihood of extreme weather with their parents. 1
I have always gotten a deep satisfaction from helping others and volunteer in many capacities in our community. 1
I have been in that position a few times myself so think I might have a couple tears in mind if that was to happen in front of me 1
I have been in this position bedore 1
I have been sending money to GreenPeace monthly for years. Maybe I will change my donation to CLear Air Action. 1
I have been that young mother many years ago so I know how that feels and I was so very grateful that I had friends that was willing to give me a hand so I would in turn do the very same thing if I was able to do so if not financially I would you know figure out a way of transporting them to a food bank to where they could get some food 1
I have been that young mother. I don’t have to imagine. 1
I have been there, there is absolutely no way that I would be able to sit back and do nothing! I would be just as scared, lost, angry and frustrated as this young woman is, that I have to sit there and do nothing. 1
I have been there. 1
I have been trying to help the environment in small ways, as my I come is limited.
That doesn’t mean I can’t tell others about the importance of keeping our beautiful planet clean for humans and animals.
1
I have been where you are. 1
I have charities that I donate to. Some are for the support of our veterans who come home with the invisible wounds of war. Some are for the support of children and teens that have not had the best family life. 1
I have charities that I give to each year. Please take me off your list. Thank you and be blessed. 🙏 1
I have donated to Donor Choose a few times, and have always been happy with this. I like filling an actual need a teacher has, as I was a poorly paid teacher once, and had to pay for everything out of my own pockets. 1
I have encouraged all of my kids & grandkids to read. I contribute to 1st book which helps place books also 1
I have experienced this. I wanted to find her a place to stay immediately. 1
I have great grands; I would hope they could get to appreciate the earth 1
I have had family members and friends that have died from cancer. When a cure is found for cancer that will be wonderful. 1
I have have access to books all my life. I can’t imagine not having any books available as a child. I would ask the child what they want to know more about and then offer to get them a book that is best for their age.🙂 1
I have interest in another direction that deals with dogs in need 1
I have it and don’t know if I’ll have a chance to stop it 1
I have just adopted a shelter dog with the understanding that she will not go back to the shelter if I can no longer care for her 1
I have lived in the poorest of the poor countries and know that humans don’t do well all around if their bellies are empty. I have been involved with Feeding America and other organizations who make sure bellies a full. 1
I have lots of charities I give to. I didn’t feel the need to continue with your questions. 1
I have no children 1
I have no children or grandchildren and never will. I am also autistic so I don’t relate to other people well. That is one reason why I feel that environmental protection is important. I am more interested in restoring the planet and protecting animals than I am in people. The number one thing wrong with this planet is that people are grossly destructive and there are far too many of them. Honestly, I feel that all attempts to save the planet are doomed to failure. We need massive population reduction and an end to wars and dictatorships. That isn’t going to happen so the planet is doomed. All we can possibly do is slow the destruction. I am very, very glad that I never had children. 1
I have no children, so I’ll never have grandchildren 1
I have no clue 1
I have no grandchildren. 1
I have no idea 1
I have no idea what they would say let alone how it would ““make me feel.”” But I’ll go to their website and check them out. 1
I have no money to give to charity. 1
I have no response to this. 1
I have nothing ..very rude comment!!! 1
I have one of those dogs. A friend of mine let it be known that there was a dog at the humane society who was surrendered by a 91-year-old lady who had to go to a nursing home. The dog was 11 years old. I went out to meet her and she went home with me. I am trying to get the humane society to arrange for me to take her to visit the lady. 1
I have someone close to me who may have witnessed this I will hate that 1
I have taken my son there 1
I have those kids. I want the world to survive so they can thrive. 1
I have to leave an emergency came up,,,sorry 1
I havs spoken with low income students & would see they need to further education without a financial burden. I now live in Tennessee & we have a program that pays tuition for college education I imagine they would be relieved somewhat & more so eager to jump on Training for a better chance in Life. I sure Thank God & st. & our Gov for all kids born here to have this opportunity. If this what you call charity so be it… 1
I help a lot of people 1
I help people all the time 1
I hope I was of some help. God bless you, and thanks so much for your sacrifice 1
I hope that in future generations there is more compassion for the animals in the food chain. They feel pain, fear, suffer at the hands of humans. I don’t eat meat and wish others didn’t as well. 1
I hope this will help generations of your family and community 1
I hope very good . 1
I hope you will get an education 1
I imagine I’d feel the same way that I feel about the crushed turtle 1
I imagine he might tell me that he is willing to do whatever it takes to get him and is family back on their feet. His commitment and enthusiasm inspires me to work with him to make that happen. 1
I imagine that they would say thank you for helping to fund my treatment. I would be very happy with a thank you 1
I imagine they would thank me for the sweet dog or, cat 1
I just did what The LORD wants me to do but it’s not enough! 1
I just did what was right 1
I just feel ok 1
I just want to know the man I I met a month ago does he love me or was he just gaming me that’s all I need to know to go out with my life 1
I know I do this everyday 1
I know exactly how that feels 1
I know first hand about a school that was like this. The one my children went to out in rural Missouri. My son had a 138 IQ but they didn’t have time to teach him at his level. Most of the children could barely make a C grade. The parents and school system just figured the kids were dumb. My oldest daughter graduated and was accepted at a private university but my other daughter and son were so bored they quit before graduating and got their GEDs. More people moved out here from St. Louis and were unhappy with the school district. The school board brought in better teachers and administrators. changed the teaching and projects and totally turned the school around. Now it is a great school and more positive environment for the students. My oldest grandson graduated 2 yrs. ago from th 1
I know how important this is to you knowing Lucy will be ok and you can rest easy. 1
I know people with cancer 1
I know that my Grandfather always said that farming even with all the new ideas and equipment that it is a big gamble and never easy 1
I know the Trevor Project. I had hoped you would tell me about something better 1
I know the feeling 1
I know they would be at a loss. They would feel devastated. My heart would break for them because I know how they feel. I was laid off from my job of 20 years at the age of 48. 1
I know they would say ““thank you”” 1
I know they’re coming and I do what I can as an individual, but that’s not enough 1
I know. I feel the same way! Who would take care of mines! 1
I like St. Jude 1
I like doing charities to feed the homeless and to give to orphans or sick hospital ed young cancer patients. 1
I like it 1
I like treating for his pain 1
I live this. I teach at an ACTUAL public school 1
I love RIF! I directed a non profit that worked with small groups of K-1 students ( not students already receiving services) to get them to grade level by the end of the year. The program success rate was around 95 % each year. 1
I love animals and usually give to Best Friends, but will consider ASPCA in the future 1
I love habitat for humanity 1
I love helping an individual personally –I feel it is what God would want me to do so, I make up Blessing Bags to giv e to homless people standing and begging on the streets..the bags contain snacks, gloves, socks and money…. 1
I love him 1
I love it 1
I love it. Keep learning. 1
I love kids 1
I love reading book that hobby 1
I love you 1
I m a cancer survivor I know we can win 1
I made sure that my own children were afforded every opportunity available to them and I was involved as well so I feel like anyone who is willing to invest in themselves and have a good foundation, it is what I want for my kids of the world!! 1
I may easily give them some relief 1
I may not be able to pay for him,but I would be asking if some one else could. And also Jesus uses me to pray for people to be healed . 1
I may not be in a position to help 1
I mean, I would feel gratified. I helped someone out when they needed it, and instead of using the money for housing, they could use it for food and other necessities. 1
I mean, I’d feel good no matter if it was me who personally helped them or not. 1
I mean, I’d hope he would know that what he’s experiencing is a failure of our system not a failure of any one individual, let alone me. We need universal healthcare, not to blame random Internet people for not providing medical bills for hypothetical firemen. 1
I mean, that’s great and all– but I encourage you to steer away from prompts that include children. There’s lots of folks who don’t want kids, and there’s so much emphasis placed on kids in environmental work– it’s kind of frustrating, when it’s adults who need to do and take responsibility for the work. 1
I meant to learn to read. Can I change my answer? 1
I miss understood 1
I must find a way to help meet his needs 1
I myself would feel horrible. Everyone needs skills, job training 1
I myself, am in that situation. I am resisting getting another animal for fear of dying before them. As a volunteer (donator) I would do my best to help them find a friend or family to assist. I would let them know there are rescues out there that can assist in this type of situation & keep donating! 1
I need a car to be able to get to any job I can get 1
I need another charity. I need to retake quiz 1
I need help myself 1
I need to educate what all the factory animals go though 1
I need to help you 1
I never give up i if told them to try out and thry turned him down then the next message forwould have to be we troed ate we going to sit here do nothing? Np. Look other avenues yo find sippoû 1
I never had any kids or grandkids to add to the pollution and destruction of the planet. 1
I never turned a trying family down for food 1
I no someone like that 1
I not interested talking bout no rain fronest 1
I prefer not to continue 1
I prefer not to play ““how would this make you feel”” games. Didn’t realize I was opting in for a visit to my therapist 1
I prefer to contribute to local charities. That being said, ASPCA sends unending spam. 1
I prefer to help wild animals in the U.S. 1
I primarily help African elephants as India is a wealthy country capable of paying its own way for its animals. 1
I probably won’t have grandchildren because of climate change, though if I did, I would share with them what we tried to do. 1
I protected habitat where I lived 1
I quit 1
I read about it every day 1
I really do not know 1
I really don’t how I would I guess be all right with me 1
I really feel bad 1
I run a nonprofit charity and need advise . 1
I said I wanted to concentrate on charities within the US. 1
I said that I don’t have any time for you 1
I sent in money, but not enough people did. 1
I should have know this was a b s deal! 1
I should help him all I could 1
I still thinking. 1
I stop 1
I struggle to relate to our country’s athletic preoccupation, but I do feel there needs to be more places of acceptance 1
I support Relay for Life in 3 or more of their events every year for over 20 yrs. Also Eagles Autism Foundation, Donors Choose, St Jude Hospital, 2 Veterans groups and Rare disease. Medical programs and research are my priority. 1
I support charities, through my actions and limited funds, that help with this problem now and in the future 1
I support the Salina Rescue Mission and Mission OKC both are local charities feeding body and soul. I volunteered for both ministries for years. 1
I suspect they wouldn’t say much. It is hard to appreciate something like books when never exposed to them. But books help people!learn empathy and dream bigger so I would feel sad for that lack in their lives. 1
I thank God for you or I think Jesus for sending you too help me in my time of need 1
I thank and iwould thankthemfirthieelGod for his blessing of foodforthem 1
I thank if we just Love each other.Look kindness to others. 1
I think I made a mistake getting on this 1
I think I will pass. Because I already have charities that I donate to in the u. Yes. And they are very good and very reliabut thank you for your offer 1
I think I would feel extremely grateful to Christ in Heaven. Everything I donate is for Christ and His Children. He is my only Savior and my salvation. 1
I think I’ll stop here. 1
I think he would be in a better place 1
I think it would be great 1
I think it would put there mind at ease knowing they would be taken care of 1
I think maybe if I’m going to talk to my grandkids about this I should narrow down my search to the homelessness and poverty situation 1
I think me feeling like extinction was my fault because I didn’t give to a charity would mean I was emotionally very unhealthy… I wouldn’t want to model that for a child… that the failures of the human race could be her fault alone if she doesn’t give money away 1
I think that is awesome 1
I think that she and her children would say thank you and possibly cry in relief, and that would make me feel amazingly fulfilled. 1
I think that’s wrong 1
I think the federal government audit give more to the schools and teachers so that they can help the children with more room and more teachers they will be able to help the children it will give the children more learning because my answers in my questions don’t come out to a roll of beans but the federal government has the money and the ability to do this 1
I think they would appreciate me for the work. And I would feel so released, happy and wish to help more people 1
I think they would be happy that I’m helping people. 1
I think they would understand that I was concerned but was able to do little individually but that it was now their responsibility to take over. 1
I think this is a good idea for everyone 1
I think we need bigger answers than beach clean-ups. 1
I tried 1
I tried to stop the trees from being cut down..but they just pushed an old woman too the side of the road 1
I truly believe it’s in the GODHEAD hands, as Jesus the begotten Son of God Almighty and his Name and his BLOOD, and The HOLY GHOST our Comforter which is truth. As the triune God. The divine Healer of home is Jesus Christ, and Jehovah Roi The LORD my Shepherd or the Jehovah Rophi The LORD my Healer. The Anointed King of kings. O how HOLY is He. 1
I understand 1
I understand because I that young woman once,whom the government would not help at all. I really feel for children or anyone who’s hungry 1
I understand cancer and it’s needs 1
I understand poverty 1
I understand what you are going through for I have lost my mother and father who lost their lives from that ugly word CANCER!!!! 1
I use food banks 1
I used to take food to pold people that are sick 1
I volunteer at a shelter 1
I volunteer at spca… 1
I volunteer for NOVA Hope for Haiti. We do that and supply fresh water. Salary only for medical staff and good use of resources. 1
I wanT NO KILL 1
I want all children to read it will make me very sad if they don,t have books 1
I want everyone in the world to have clean water 1
I want out of this ! NOW! No shaming, etc. 1
I want to be the person who says, ““I’m so sorry that happened to you. Here, could you please fill out this contact information while I connect you with the person who will HELP YOU.”” 1
I want to help 1
I want to help a variety of people young , old and in between! 1
I want to help the Palestinians being slaughtered by Israel. Can you just find me that one ? 1
I want to help you. What are some of your thoughts on things you want for your child and yourself 1
I want to help. What can I do 1
I want to pay it forward -PHENOMENAL! 1
I want to retake quiz 1
I want to run away from Afghanistan I want to escape from violence I hate the Taliban terrorist group Please take me out of Afghanistan 1
I want to what I can so you have a healthy planet to live on 1
I want to work, but my computer skills were weak. Now I’ve got a new job! Excited for them. 1
I wanted something mental heqlth related 1
I wanted to end the conversation. Thanks for the information 1

I was a pre school teacher

The same identity
1
I was dairy pleased that he was able to return to his old cell. I know I probably shouldn’t of started this because he probably think I’m young age and I am not I am 80 but I have so many losses to heart attack. It just makes me sad I would give anything if I was a smart enough to do this, but I thank you for talking to me. It was wonderful getting to know different things. Thank you so much always Betty. 1
I was fine filling in the survey but stop harassing me to type out a free text answer 1
I was homeless & I went to a shelter that changed me & started me on the path to a normal life addressing all of my issues & I wouldn’t be living even the simple lifestyle of a Grandmother/Mother 1
I was hoping to get a charity that was more aligned with my interests 1
I was in a similar position 30 years ago; the law and policy focused on equity assisted me so now I’m in a place to assist you. Sisters must help the generations following us. 1
I was that child 45 years ago. I never did go to college. Instead, I took typing classes in high school and got a job as a typist. I eventually worked my way up into a better paying job. Just many of my classmates. We worked hard. While education is important, there are many other factors to help yourself get a good job. 1
I was that kind of child and my mom was that mother 1
I was that mom. I cannot let a child go hungry 1
I was that woman 1
I was thinking more about rare kidney diseases 1
I wasn’t sure how to answer. Although I support saving the rainforest, it’s not my passion. So I was kind of disappointed with that choice. 1
I watch a lot of nature shows. The more the better. I’m not fond of bugs snakes or spiders. It never used to bother me, but it seem as I got it makes a difference. Sorry, I’m a candy butt now. 1
I went to your site directly so no need to keep DMing me 1
I were one point from been leukemia it is very important to me 1
I will 1
I will Foster cats and I will be the one to keep them and find them a good home I am not donating money I will donate my time 1
I will be so glad that am trying to find a cure for this kind of illness. 1
I will be so happy when every cat and dog are safe warm and healthy, Given homes with loving families who realize they are part of a loving family! 1
I will be very nice😊😊 1
I will be very worried 1
I will cremate her and take with me 1
I will do anything in my power to help 1
I will do everything in my power to help him above and beyond 1
I will do my part as a family provider and a husband material 1
I will feed them and take them to a fire house 1
I will feel awful because humans are the ones being cruel to the animals 1
I will feel bad 1
I will feel bad and look for a possible solution available. 1
I will feel better 1
I will feel better because God got my back 1
I will feel great 1
I will feel guilty because I would like them to live in a clean world free good air. Free from sickness. 1
I will feel happy in heart knowing I brought peace to the lady in her last days and the dog will be taken care of and safe. 1
I will feel relieved bc they have a safe place and a place to call home 1
I will feel scary for awhile 1
I will feel some type of way 1
I will feel very sad because that’s a way he feeds his family and love ones just like the old says do as to others has you will like done un to u . 1
I will feeling so sad for them 1
I will find out for you 1
I will give Lucy to a. Very good home , I would adopt her Ina second 1
I will help her 1
I will help you 4
I will lick pussy 1
I will look them up and read more. I have donated to Save Our Bees 1
I will provide clean water 1
I will take her to live with me 1
I will tell her to relocate there. Stay on campus still she’s done 1

I will tell the old lady to let me take care of Lucy I will promise she is going to be well taken care of.

Lucy will have everything that she needs.
1
I will thank God because is the sustainer in my life 1
I will try my best to help them. If they refuse my help then nothing I can do. Will help those who need and accept my help 1
I will try to borrow money to feed them 1
I will try to do all I can to help them 1
I will very happy. And I will continue more! 1
I wish I could help 1
I wish I had books to read 1
I wish I had money to help but I don’t but I pray for them 1
I wish I had the education I might have been able to doore about that problem 1
I wish that I could help you for 3 to 6 months financially as long as you are willing to help yourself and your family by attending a trade school that would give me a weekly update on your progress and possibly work a part time job if possible. If your significant other could work, great also if you have teenagers possibly they could help the family as well. Hopefully working as a TEAM / FAMILY, eventually we could hopefully get everyone some time of trade or skill. 1
I wish that was the case….that milk came from Happy cows 1
I wld fell sad that I didn’t and try a way to help 1
I won’t have children so I won’t have grandchildren. Can I redo this quiz? 1
I won’t have grandchildren 1
I wood love. It 1
I woodfield seal awful I would be sad I would try to help this man even if I had to reach in my pocket to give to him it would be just terrible I would try to help him 1
I work with a non-profit– climate Council Greater Knowledge Center.– so far my money has been going to build this organization. 1
I worked with people with developmental disabilities before I retired. Enjoyed it. 1
I worked with the poverty program many years ago. Many of the teems I worked with could not read at the third grade level. This seems too simplistic. 1
I worry about my mom all the time. I get food and cook for her 1
I would be very upset 1
I would do my best for him,her and introduce the to a charity that help people in their citation 1
I would feel sad. But I would tell them I would be.glad to read to you. Don’t worry I don’t know all the words in a book. 1
I would make sure they have books to read 1
I would volunteer to take her dog 1
I would .feel bad let him come work for mel 1
I would ALWAYS quite him to help animals in distress and to always be kind to God’s creatures. You tell ALOT about a person on how they treat animals. 1
I would Make eye contact with The mother and tell her that she is at a safe place and not to worry about anything AND to get some rest For tomorrow is a another day 1
I would NOT want praise! It prefer giving secretly 1
I would able to help you out 1
I would appreciate they were a beneficiary of the agency 1
I would ask a few questions to help discover why no books at home. Ask about libraries at school and public. Ask about interests to see how I could help. 1
I would ask him what his hobbies, were,& incourage him to look for any job to get bye & prayed bills & don’t be afraid to go look & be yourself & dependable as been at the factory job a long time. Put yourself out there. Don’t get discouraged if don’t get first job you apply for. Will have to do many different jobs before the right one comes along & prayer to our God almighty can help. 1
I would ask mom if I could help her cook dinner. 1
I would ask the family members if they would be able to help take care of Lucy or if I could help them with trying to locate a family that would love to have Lucy and take excellent care of her. 1
I would ask them if they had any food and a place to stay 1
I would ask them if they needed a place to syay 1
I would b so happy to know that I made a difference in somebody’s life. 1
I would be very grateful 1
I would be buying books to help with his/her reading. 1
I would be distressed. 1
I would be embarrassed 1
I would be embarrassed and ashamed. 1
I would be extremely saddened by this. Dogs are family and I would do whatever it takes to find a loving home for Lucy. Even if it would mean to foster Lucy until I can find a home for her. 1
I would be fearful of the future for my children & grand children. I’ve been to the rain forest in California & seen the beauty & diversity of the plants & animals that grow only there. I know that other rain forests also have a unique environment but that they all are like the lungs of the earth. If they are not preserved on a large scale it will be devastating for the ecosystem. And humanity. 1
I would be feel fantastic, particularly if my grandchild had no idea or concept of what a garbage island even was due to such a clean ocean 1
I would be filled with joy 1
I would be glad that they had this help and hope that they could continue to get what they really needed. 1
I would be grateful 1
I would be happy 1
I would be happy for him. 1
I would be happy that l was able to be of help 1
I would be happy that they could eat, but sad if I could only provide a few meals. 1
I would be happy they have something so basic as safe water! And happy that others will have access too! 1
I would be happy. 1
I would be heartbroken 1
I would be heartbroken to leave the world without having done something 1
I would be honored if he trusted me with his most important feelings and I would be happy to help him in any way I could help him and or his family 1
I would be humbled. 1
I would be hurt due to the fact that I was trying to help someone who didn’t appreciate it 1
I would be incensed on her behalf and eager to take on the employer, even though I don’t have the resources to do so myself. 1
I would be joyful that I made a positive impact on a child’s love of reading and literacy skills — hopefully. 1
I would be more likely to assist them 1
I would be more than a bit ashamed of my lethargy 1
I would be mortified!! 1
I would be piss 1
I would be pleased knowing he received the proper care. 1
I would be pleased that I could help. 1
I would be proud of them 1
I would be quite happy, & humbled . 1
I would be sad 1
I would be sad .I have a home for 3 weeks my water is going to off CANT pay my rent.But I her and child I have left 1
I would be sad I would then ask them if it was ok if I prayed for them an with them then I would pray 1
I would be sad and I would want to help them have access to food 1
I would be sad and a little bit angry that I didn’t do something to help. 1
I would be sad and frustrated about the situation 1
I would be sad and frustrated at their loss of opportunity 1
I would be sad because he is struggling and feels lonely and afraid. 1
I would be sad probably 1
I would be sad, because that may happen to my cats and dog, sooner than later. 1
I would be sad. If someone treated her like that. 1
I would be so over welmed and feel good inside this family is warm in a bed with clean clothes and beddingandafull belly. 1
I would be so thankful and graceful for your treatment clinical trial. 1
I would be so very very happy within my soul 1
I would be thankful that I succeeded in helping someone have a better life i guess i don’t know 1
I would be the first person to bring her and her baby home with me 1
I would be the one person for saving my fathers life if this happened to me. 1
I would be thrilled that Lucy got a new loving home. 1
I would be thrilled. 1
I would be unhappy because I didn’t do anything to keep our environment clean for them 1
I would be upset with myself because I didn’t do my best to help 1
I would be upset 😔. I would like to know that my work that I worked so hard for doesn’t have anything to hope for.😢😥🙏🏾❤️🙏🏾 1
I would be upset. I would want to do something 1
I would be very depressed if there was nothing I could do , I would take food from my own home to them if I couldn’t find a place to help 1
I would be very glad thatI could help her feed her family! And would appreciate a thank you from her. That would be enough and that she greatly appreciate the food! I would feel good inside that Zi could do that for some one need! I used to help my neighbor man . And bring food over to him and he was not of good health! I know he appreciated it! 1
I would be very happy and proud that l help someone.get better and to live longer 1
I would be very happy and thankful that God has given me the opportunity to help 1
I would be very happy to have helped. 1
I would be very happy to know that I helped make them feel safe and secure. 1
I would be very happy. Continuing love and care is very important. 1
I would be very sad 1
I would be very sad about it 1
I would be very sad and quite empathetic for him, and would try to help him and provide moral support. 1
I would be very sad that a child with true potential was not getting the support he needs to be as successful as he is capable of. 1
I would be very upset 1
I would be very upset but I would refer her to a social service agency 1
I would be well pleased to know I helped someone out 1
I would be worried for her. I have been there 1
I would buy them some food an tell them if they need help 1
I would calm them and help them calm down so they can forgive and forget. 1
I would convince them that a better life lies ahead. 1
I would definitely help her find a place to live 1
I would definitely change my answers about not doing anything to help with the rare disease. 1
I would definitely help 1
I would do anything I could possibly 1
I would do anything in my power to help clean the ocean up around the world because one of the ocean stops everything goes wrong 1
I would do hreat 1
I would do my best to help them 1
I would do nothing? Not possible 1
I would do something to help her! St. Vincent de Paul, Salvation Army, Hearts with a Mission, several churches I know of……I would fine help for her! 1
I would do something to help if it was just to get a list of what she felt she needed first, then go buy the groceries for her. 1
I would do something to help right away, it is a crisis for that family, that moment . 1
I would do something. 1
I would do what I can to help this student find different avenues to help assist with the cost of a diploma. Underprivileged students have more options than the middle class students. 1
I would do what I can. Coming from my heart 1
I would do what ever I can to help her 1
I would do whatever I can 1
I would do whatever possible to help 1
I would donate. 1
I would encourage her to by safely 1
I would encourage her to speak to someone at ASPCA and possibly discuss options for Lucy. 1
I would explain to my grandkids how it use to be so different when I was growing up that they are destroying rain forest and parks 1
I would feed them and take them to find decent shelter next step trying to find her a job so she can be in her own place to call home we don’t have decent shelters here we need them desperate 1
I would feel Happy the animal has a good home 1
I would feel a little bit relieved because I was able to help a person who needed most my help 1
I would feel accomplished empowered and zen. 1
I would feel amazing 1
I would feel amazing knowing I’m helping someone care for her family like everyone should be able to 1
I would feel amazing, like I was fulfilling a purpose. I lost my grandfather and mother to Colon Cancer, and if I could help someone, no matter what cancer they may have, to have even a little more time with their loved ones, I would feel like my life has meaning. 1
I would feel as if I had personally let them down. I would hate the thought of parasites sapping their life force 1
I would feel as if I made a difference, and would have a sense of pride in what I do. I would feel protective over my newfound friends. I would want to assist them in getting used to the customs and culture shock of the US. 1
I would feel as though this child was living in a home that was the result of several bc generations of children who had beef left behind. Good possibility his parents couldn’t read Hiss/her teachers had just push him/her through without seeing to it that he/she had not been given the proper help to over come the ability to read. The education system, I.e. , many teachers and education boards do not look at students who don’t automatically Excell as a drag on their time and money. I am speaking from firsthand experience. After I retired I volunteered 7 years as a para pro in our systems middle school. I was appalled at what 7th and 8th graders cou li don’t do. My first year I was in math classes. I had 5 students who couldn’t multiply beyond 3. The following year I was in a Soc 1
I would feel ashamed 2
I would feel awesome helping someone get the treatment he needed after all his job was to protect us and to help him I would definitely feel blessed 1
I would feel awful 3
I would feel awful and I should note that I have given monthly to SPLC for 25 years 1
I would feel awful and feel like I would have to make it right 1
I would feel awful and probably offer to adopt Lucy so that the lady wouldn’t worry. And then I would adopt Lucy or find her another good home. 1
I would feel awful if I couldn’t help that’s why I keep canned goods in the house for anybody that needs some I can always give to them 1
I would feel awful if there was nothing I could do and nothing I could offer this man 1
I would feel awful! 1
I would feel awful. It would.be horrible to be in that situation 1
I would feel awful. I sent donations years ago when I was a teen,to save elephants and though it is somewhat improved, poachers still are killing elephants for tgrirbivory snd their habitat is endangered. Actually I try to donate to my local Humane Societies, as well as St Jude. So I guess I am a diverse giver with my limited income to try to help locally and globally both animals and humans. 1
I would feel bad 5
I would feel bad and do what I could to provide her with some food 1
I would feel bad and that I wasn’t being a very good Christian and I would have to ask Gods forgiveness,however I do donate to St.Judes hospital as often as I can 👏🙏✝️✝️✝️ 1
I would feel bad because his chances of achieving this would appear to be low. 1
I would feel bad for him, cuz in today’s world, it’s a short struggle and I would try to help him with places he can go to help him an his family out. And them resources are getting very scarce as well 1
I would feel bad for the animals and people helping them. However, it is ultimately not up to me. I am powerless to this. I do not have a habitat for them. I can rescue a dog. I can care for my local nature. I cannot do anything for a lion 1
I would feel bad for them and try to talk with them and encourage them 1
I would feel bad than whatever it takes to find out what to do? 1
I would feel bad that they weren’t treated properly 1
I would feel bad! 1
I would feel bad, but wonder if Surfrider is really the best charity. Would prefer to prevent plastics in ocean to cleaning up. 1
I would feel bad. 2
I would feel badly because I was not able to help him out of a poor situation. 1
I would feel badly for them but I would have to share with them how much Jesus loves them. 1
I would feel better from Steven 1
I would feel better knowing my money was helping. 1
I would feel better knowing they had a safe place to at least lay down to sleep in peace and feel safe 1
I would feel blessed ,happy 1
I would feel blessed and know that 1
I would feel compassion and want to help. 1
I would feel compassion for the young man and I’d also feel protective. 1
I would feel compassion, but I would also feel some responsibility to help in an effective way. 1
I would feel compelled to do all I could to help her and the family 1
I would feel compelled to help them. I have been in that situation and I would tell them my own experience strength and hope and where I am now at tiday 1
I would feel determined to get this child a library card and signed up to Dolly Parton’s program 1
I would feel embarrassed. I don’t need praise for doing the right thing. I do it because the person I want to be is someone who fights for justice, equity, and reason. 1
I would feel empathy, and great sadness for him. I’d want him to know that out there in the world are more people like us, and we can be loved and accepted. 1
I would feel enormous gratitude. 1
I would feel even better if I was talking to an adult who has had a full life because of the research done by St. Jude 1
I would feel extremely happy to play a part in improving education to the needy 1
I would feel extremely sad. 1
I would feel frustrated with the situation 1
I would feel glad I was there to help him. I did my job as a human. 1
I would feel good 3
I would feel good about get her dog to a good home 1
I would feel good about helping them 1
I would feel good about it 1
I would feel good and hymbled. 1
I would feel good being able to make sure that they would have a fighting chance of life 1
I would feel good cause I love dogs 1
I would feel good in that situation. 1
I would feel good inside 1
I would feel good inside but there other channels that would have to help out in her situation too 1
I would feel good inside knowing that I was able to help someone because it is scary very scary but lean on the Lord too the Lord help you get through everything 1
I would feel good knowing her pet would be taken care of after she is gone. 1
I would feel good knowing that the fur baby was took and love after. Every body needs love and care for. But animals need to be care And love to. Because animals are God’s little creatures. And they need love and care about.❤️. You see I got my little fun baby for the pound . Her last owner put a Chain around her neck and put her outside in the Cold Months of Dublin Ga. But I got her now . When I open the gate at the pound she jumped into my arms. She was 11/2 then she 6 now She is well love really she SPOILED Rotter 1
I would feel good knowing the children can read 1
I would feel good she would learn how to read 1
I would feel good that I didn’t just meet an immediate need, but that I helped prepare him for long term success. 1
I would feel good that I was able to help someone 1
I would feel good that i helped someone 1
I would feel good, but I would do it even without the appreciation 1
I would feel good, glad that I could help someone. And possibly even more people in the future 1
I would feel good. 1
I would feel good. My husband had cancer and through a lot but he didn’t survive. 1
I would feel grateful and happy 1
I would feel grateful that I was able to contributing to the survival of animals that might otherwise become extinct. 1
I would feel grateful that he was able to get the help he needed to live a long healthy life and I would also want to help the homeless and the animals anyone that needs help if I were able to help 1
I would feel gratified that I made a difference in her life. 1
I would feel great 3
I would feel great .my son wants to be a computer programmer he is in early college getting into computer science so someday he can make his own games 1
I would feel great and give all the glory to God!! 1
I would feel great bc I fed someone! 1
I would feel great but would want to follow up with her to make sure she or he was 👌 1
I would feel great knowing I helped people. However 1
I would feel great knowing that I’ve helped someone. That’s what we all need to do is try helping someone. 1
I would feel great saddnessand remind me of my many friends and my husband who are firefighters 1
I would feel great, after a while I’d have to feed the family again and realize that while I keep feeding them they won’t plant seeds, they become dependent on someone to feed them and over time they lose their knowledge 1
I would feel great. 1
I would feel guilty 1
I would feel guilty because I didn’t follow through with my desire to save the families if these beautiful and amazing animals 1
I would feel guilty for not helping where I could be of assistance 1
I would feel guilty that I have so much and she has so little. 1
I would feel gut-punched 1
I would feel happy 1
I would feel happy and content to serve my duty to care for those who don’t have a voice. 1
I would feel happy for the women. 1
I would feel happy that I helped someone. 1
I would feel happy 😊 1
I would feel helpful, caring 1
I would feel helpless and sorry for her. 1
I would feel helpless to provide assistance 1
I would feel helpless. 1
I would feel honored to have helped make treatment possible 1
I would feel honored yet concerned for this young man 1
I would feel honored. I really wanted a suicide prevention charity. 1
I would feel hopeless 1
I would feel horrible 4
I would feel horrible and that I am not a caring person. 1
I would feel horrible if I failed to help someone in such great need 1
I would feel horrible. 1
I would feel horrible. However, I’m already a monthly donor to the ASPCA. 1
I would feel horrible….but i am already doing this in my personal life 1
I would feel inadequate and like a failure 1
I would feel inspired to do the same. I’d feel seen, and supported. 1
I would feel let down like the guy that just lost his job an his family he needs to support. I wouldn’t care what they said the issue is the man an his family. 1
I would feel like I actually helped someone that was thankful 1
I would feel like I am the most selfish person in the world. 1
I would feel like I disappointed them. If I knew I could have impacted the planet in a good way and failed to do something about it,I would be ashamed of myself. I have no money, but is there something I can do now, that can help? 1
I would feel like I followed the purpose of life, to help others. 1
I would feel like I had done good. I don’t give to this charity, but I give to food and housing organizations in Oakland and Berkeley. 1
I would feel like I had done something worthwhile 1
I would feel like I had some part in it 1
I would feel like I had to help them immediately 1
I would feel like I haven’t done enough 1
I would feel like I made a difference 1
I would feel like I made a difference. I regularly donate to World Central Kitchen. 1
I would feel like I made a tiny difference! 1
I would feel like I need to do more and try to find a way to help her. 1
I would feel like I needed to help her and set her mind at ease 1
I would feel like I was making a difference 1
I would feel like I would like to spend more time with that and help them 1
I would feel like a failure and like I was behaving irresponsibly for years. 1
I would feel like a good person 1
I would feel like bringing them home 1
I would feel like doing it again. 1
I would feel like my giving was not in vain 1
I would feel like my investment in this charity had been a worthwhile one that has contributed to good work. 1
I would feel like that person got cheated . 1
I would feel like that’s a strange interaction. 1
I would feel like this was one tiny step closer to helping her get back on her feet. 1
I would feel like trying to tutor them myself, if I could. 1
I would feel love as a follower of Christ. 1
I would feel many things especially how greatful I would feel for being able to help the family I would feel honored to do for others ! 1
I would feel motivated to try to help. 1
I would feel moved to donate 1
I would feel overjoyed 1
I would feel pleased that I helped in some way that gave her hope for a cure. 1
I would feel pretty awful. Thank you for your assessment. I think I will continue to support Week of Compassion and Church World Service instead of HIAS. 1
I would feel pretty damn proud of myself for knowing that I funded that research to make that happen for her and millions others like her in those types of situations 1
I would feel proud 1
I would feel proud and happy that my grandchildren will have safe happy lives 1
I would feel proud and some relief that at least one hate group had been thwarted. 1
I would feel proud of our accomplishment. 1
I would feel quite selfish. As a 70 year old I’ve always tried to be charitable to the less fortunate. 1
I would feel r 1
I would feel really bad that it’s poor man couldn’t get the help insurance that he would need at the time he needed it 1
I would feel really good knowing I was able to help 1
I would feel really good that I could help a child out 1
I would feel really sad about this situation 😞 1
I would feel really sorry for them all especially children 1
I would feel relief that we are safe from the dabger 1
I would feel responsible for displacing the lions 1
I would feel sad 4
I would feel sad and I would tell the old lady not to worry that when the Lord takes her home I will take Lucy and take care of her as she is my own 1
I would feel sad and guilty 1
I would feel sad and guilty if I didn’t do anything. 1
I would feel sad and miss them of course but if it matters them in the long run and they will be happier I’d have to say be happier. I won’t forget I’ll remember! 1
I would feel sad and scared for them 1
I would feel sad and seek help for her. Many people out there don’t give a ____ these days 1
I would feel sad for him. 1
I would feel sad for them, but also thankful that they were able to make it to where they are. I would feel compassion for them. 1
I would feel sad for them, but would immediately want to find ways to help. Call friends see if their are any jobs available, seek out government agency. Let them know help if available, don’t give up. 1
I would feel sad that the high school girl feels less than. 1
I would feel sad that the lions are being put in danger and I would want to help any way I can 1
I would feel sad. 1
I would feel shame and sick to my stomach. 1
I would feel shi 1
I would feel so bad 1
I would feel so bad and say how sorry I am that I was not more considerate 1
I would feel so bad. They need help to take care of there family. 1
I would feel so good about helping 1
I would feel so good knowing that I saved another sweet life. 1
I would feel so happy 1
I would feel so heart broken because I kinda been in that situation but I would try to help any way I can 1
I would feel so proud of myself for helping bringing a school of education to the neighborhood 💯 1
I would feel so sad for the woman and the animal. The fear and loneliness and confusion of the dog, and the worry the woman would feel 1
I would feel so unhappy 1
I would feel sorry for her and her child i would want to help her find a safe place to sleep with her child 1
I would feel sorry for her and take her home with me 1
I would feel super happy that I was able to help someone reach there goal 1
I would feel sympathy, worried, concerning, upset and trying to figure out a solution 1
I would feel terrible 7
I would feel terrible about the animal going to a shelter 1
I would feel terrible and offer to help learn the 3Rs 1
I would feel terrible and want to feed them right away. 1
I would feel terrible and want to help 1
I would feel terrible because I have been there. I can’t help with money but I know resources now. 1
I would feel terrible for him, and most definitely would try to help him get him some type of job, even if its just doing yard work for cash. 1
I would feel terrible if I didn’t help 1
I would feel terrible if unable to help 1
I would feel terrible, but I would help immediately 1
I would feel terrible. 2
I would feel terrible. Loses his job with no opportunities for a new one. 1
I would feel thankful and proud 1
I would feel that ““at least made the start of a difference”” and ““where do I go next”” 1
I would feel that God has helped me to find a way to help others. 1
I would feel that I brought some justice into this world where it is sorely needed. Refugees do not need to be tormented by bureaucracies, they need HELP. 1
I would feel that I did what I was called to do and that it was successful. 1
I would feel that I had contributed to a need 1
I would feel that I needed to help in some way. 1
I would feel that everyone was finally safe 1
I would feel that i have accomplished my goal 1
I would feel the need to remind my flippant grandchild to put the past behind them and focus on what they can do now. 1
I would feel the need to say this is the greatest thing ever to happen in this world right now and I get to see it all 1
I would feel useless! 1
I would feel very assured and happy. 1
I would feel very bad 1
I would feel very bad & very guilty for not trying to help 1
I would feel very bad and in hindsight I might try to reach out or contact him to start over with learning whether and how I could help him. 1
I would feel very bad and want to help but I don’t know that I could. 1
I would feel very bad. 1
I would feel very bad. I would love Lucy to have a happy home always. 1
I would feel very concerned 1
I would feel very frustrated initially but then would want to strategize how to navigate the system. 1
I would feel very good 1
I would feel very good as I am 83 yrs old and want my pets taken care of when I’m gone. 1
I would feel very good to have found her and her baby a safe place to stay 1
I would feel very good to know that she has over come her sickness and thank God because if if was not foe him it would not be possible 1
I would feel very guilty for not helping feed someone hungry. 1
I would feel very happy for her and feel good that I was able to make an important difference in someone’s life. 1
I would feel very happy that I was able to assist this young man and his friends, because I not only helped the young man find his friends, I helped his friends find him. 1
I would feel very humble to have been able to do this. 1
I would feel very lucky 1
I would feel very proud of what they do and how I helped. 1
I would feel very proud that I did all I could to help him and any others with him I M also want to help Veterans in need 1
I would feel very sad. 1
I would feel very sad; I would want to help guide them with resources that can help. 1
I would feel very upset because I did nothing 1
I would feel wonderful 1
I would feel wonderful knowing a dog was going to a loving home and would be happy for the rest of their life 1
I would feel 👌 1
I would feel… Grateful. Unworthy. 1
I would fell blessed to help some one who needs it 1
I would fell good and happy for her 1
I would fell very bad I would help him anyway I could 1
I would fill very much sad because I could not Help this MAN But I am not going to just level it along I am going to Help this MAN anyway I can and get the world out about His problems so We can start doing something about it so no one else hast to we’re when a problem comes up we all need to come together as one nation again and stand as one with God and be thair for each other Amen 1
I would find a new home 1
I would find good home fore her dog and,that would be the right thing to do 1
I would find her a place to stay before i left her 1
I would find her shelter 1
I would first listen to see where she was coming from I would encourage her and inspire her to reach out to any local non-profit that could assist her in getting the legal help she needed to get her job back if she wanted her job back but I would definitely make sure that she spoke out and made sure her rights were taken care of 1
I would get food for them 1
I would get get basic needs than go from there Do my best to be of help 1
I would get them help to find a job And get assistance from 1
I would get them something to eat 1
I would give them money or buy some food and give it to them 1
I would go for a another treatment center, 1
I would go to Disneyland 1
I would have this lady her her baby and help her with whatever she needs 1
I would have to do somthing. 1
I would have to get familiar with the situation and option before I can answer intelligently. 1
I would have to help him. He gives his life every single day without even thinking a out maybe he could die to day I couldn’t just walk way I’d have to see if I could t help him get free medical at least for a unute 1
I would have to help them. I couldn’t leave them. 1
I would have to help. That’s who I am. 1
I would have to try and help her. 1
I would help 3
I would help all I could 1
I would help anyone if they needed help 1
I would help find a home for her pet. 1
I would help find them shelter cause I know housing matters wont 1
I would help her 1
I would help her and her child find shelter to keep them warm give them food 1
I would help her and make her feel comfortable 1
I would help her. 1
I would help him 1
I would help him that’s how I am. 1
I would help if possible 1
I would help them to get a shelter 1
I would help you 1
I would help. 1
I would hope I could help them out of this bind 1
I would hope I would/ could find a way to help her get away from the man 1
I would hope more to be cured 1
I would hope she would go into remission, if not, direct her to a Christian counselor that specializes with her condition & be available for her until the end. 1
I would hope that I could provide some type of assistance to them. It would make me sad. 1
I would hope that she would not feel any obligation to thank me. That’s ridiculous. She deserves safety. 1
I would hope they wpould know I didn’t do anything to help. 1
I would imagine they would say, Thank you so much’ and I would want to cry 1
I would just be happy that I helped someone work on something that he wanted to do. Especially if they really wanted to learn and better his life and others. 1
I would just say that the cow is nursing her babies to make it healthy so it sharing her milk with you then make you healthy 1
I would know how she feels and what she going throw because it’s happen to me before so I would know what to say and do to try and help her 1
I would learn more from the liabery 1
I would lesson to her and then try to help if I could try to give heR sum help know the lord jesus 1
I would like that but I don’t have the resources to make it happen. 1
I would like to be able to make a direrencein life together with all of us helping us together 1
I would like to be there to help her tuck you in or tell her in and tell him you are welcome God that for everybody to have a place to stay 1
I would like to help but would not know how! 1
I would like to help children with brain tumors 1
I would like to make sure that you have a good job with your own business and you are a good person and I would like to see you and your family in the future 🙏 and thankful for your money and the best place for you to get in touch with you and your family is a great big understanding of the best place to call their mother and father to see if they are going to have a great time 1
I would like to see the world with less trash in the ocean last mining in the Earth and less commercial fishing in the sea everything should be localized and there’s too many things going wrong with ordering we need to change the Earth to more like it was before hit is almost destroyed we’re like a bunch of termites and a piece of wood what’s the woods gone we got to go somewhere else and the Earth is a big organism we’re like fleas we’re on our dog and and if something don’t happen the fleas will tear that dog down kill it so we need to change a lot of my ways cuz I’m a American Indian and we only took for Mother Nature what he gave to us thank you and I enjoyed this 1
I would like to take them to my place and get them some food and try and help them out 1
I would listen and help out I will give it. My all. 1
I would look for a local rescue to help her. 1
I would love it,a sense of accomplishment but that’s just 1.save them all! 1
I would love to be able to do this as I just had surgery a few months ago and had complications but I am home and on the mend.❤️‍🩹 1
I would love to be able to tell this story! 1
I would love to be one of a team helping refugees find new homes and employment. 1
I would love to help this elderly woman, unfortunately I can’t afford to donate at this time 1
I would love to help you, your family, and your community. 1
I would love to know what they would say to me 1
I would love to see our family and friends get a good picture 1
I would love to work with people and places to help BUT I am disabled don’t get around to well and finance is bad. Not much I can do 😭 1
I would make a promise to find a loving home for Lucy 1
I would make me feel very good. 1
I would make sure she felt at home 1
I would mentor that mother. I’d teach her where to get help, how to shop healthy for her circumstances, how to prepare meals using healthy ingredients. 1
I would never do nothing 1
I would never do nothing. 1
I would never do somthing like that. 1
I would never do that 1
I would never leave them take them home with me 1
I would never walk away from a situation like that, I would go get food for them 1
I would not ““do nothing”” .. I would talk to her, get her story and ask some questions. 1
I would not ““do nothing”” in this scenario. 1
I would not be able to sleep. 1
I would not be doing God work 1
I would not care ‼️ 1
I would not do NOTHING 1
I would not do nothing I would help in any way I could 1
I would not feel good about i, I would have to change my ways, in order to help him.. 1
I would not have the money to help you but if I did I would help him if I could I would try to help him 1
I would not leave them alone I would have them with me 1
I would not place Lucy no where 1
I would not recommend she contract aspca 1
I would not smile politely and say nothing 1
I would not take any credit what so ever. I would thank God for moving in the right place at the right time We serve an awesome God 1
I would not want to hear what they say because I’ve been in that place before myself and just talking and not helping does nothing for the person 1
I would of took action and helped her. Their would have been no talking. 1
I would offer them a stay at my home till we get something figured out 1
I would offer to adopt Lucy 1
I would offer to take care of the fur baby 1
I would offer to take her dog once she passes 1
I would only hope they say thank you. 1
I would own the errors of my ways and explain that by understanding the grave oversights I engaged in that I feel more than ever the Urgency to make up for lost time. 1
I would pet the dog 1
I would pray 1
I would pray about it and talk to elders in church to see how we might or even food banks. 1
I would prefer to give to my alma mater’s first-generation program. 1
I would probably be in tears 1
I would probably be moved to tears. People with Down’s Syndrome are some of the sweetest people on the planet. I had a career working with those that have physical /mental difficulties until I became disabled myself. 1
I would probably let them stay at my house 1
I would rather donate anonymously so as not to embarrass anyone. 1
I would rather donate to no child goes hungry or homeless 1
I would rather get their own private homes shelters are not safe antmore 1
I would rather not have this interaction 1
I would rather play video games. 1
I would reassure him or her there is hope 1
I would refer them to local homeless navigation service with which I volunteer, and possibly to a temporary situation that helps women coming out of prison or rehab. 1
I would respond to the situation by asking her to write a grocery list of the most needed items. Then I would ask her if she wanted me to get groceries for hr or if she wanted to go shop with me. I would explain about SNAP benefits and help her sign up for them. I would also invite her to register at a local help center. But immediate food is the first priority. 1
I would said love you 1
I would say it’s about time our schools put real education too practice instead of how much administatirs make. Having. Teachers in my family I see how much they spend on the kids in their schools and checked what the administration earns per year. Maybe they need salary cuts to what teachers make and then our children’s needs will be met! 1
I would say keep your head up and pray 1
I would say that’s unrealistic. A better solution would be veganism. 1
I would see myself 20 years ago and would want to give them a hug. 1
I would sit to talk with her to find out what kind of help her and her baby needs and get them some help 1
I would speak to them about experience n also looking into job agencies 1
I would stop the procedure and adopt her dog and allow her dog to live out his/or her Life 1
I would support local individuals in need but this result does not fit my overall contributions. You should allow multiple answers to what causes interest me. 1
I would take Lucy home with me after the owner pass way. 1
I would take Lucy with me I would give her my home till a good one was found or let her live with me. 1
I would take her and give her a good home 1
I would take her to the store or go myself and give what I could. 1
I would take the animal home 1
I would take the dog and try and care for it 1
I would take the dog in… 1
I would take their information and strive to help him find employment, even if it was initially temporary 1
I would take them into my home. 1
I would talk to them and try to provide help 1
I would tell her God is with you and I am to I would make sure she takes Jesus christ our savior just in case she passes away I know she will be in Heaven 1
I would tell her I am absolutely blessed and would love to help her I too have been in similar situations and will support her 1
I would tell her I will take care of your dog 🐶 1
I would tell her how happy I am she was protected and got some justice. 1
I would tell her not be afraid, we are here to help 1
I would tell her that we are here to help others and I want to help. 1
I would tell her that we can talk about it and go over the choices that she has 1
I would tell him he is not alone and this is only temporary, then tell him together we will find resources to help get back on your feet 1
I would tell him stop smoking 1
I would tell him that cows mk is for caives 1
I would tell him that he was not alone and his feelings were normal. It would make me feel good to be there for him, even if it was just over the phone. 1
I would tell him that it made me feel good that I was making a difference for them and your future 1
I would tell tell My grand baby That i help that Animal 1
I would tell the child whatever is age appropriate at the time. I would also say that there are better things to drink than cow’s milk. It is a gradual process. And I, personally, would feel sick just thinking how people have been duped into believing how kind factory farming. 1
I would tell them about those who inspired me to protect and work for an environment that will sustain many generations into the future. 1
I would tell them to sign up for a library card where they can get all the books they want to read for free 1
I would tell them where to go get help 1
I would thank the Lord that I had the courage and the money to help people 1
I would tried and help her 1
I would try to find Lucy another loving home This would make me feel some type of way because I know her fear. 1
I would try to find a pl for them tonight and help long term tomorrow 1
I would try to find shelter for them. 1
I would try to find some good places for them 1
I would try to find someone who can take of Lucy so she will have a happy life and a lifelong friend 1
I would try to find someone who would be able and willing to care for her dog 1
I would try to get Lucy a home I wouldn’t be able to take Lucy in I got cats myself but I wouldn’t want that dog to go to shelter and if it didn’t have anybody else on her family side I would find a home for her or call shelter 1
I would try to help him find a other job 1
I would try to help him get back on his feet. 1
I would try to help them TH best way I could . That would b a sad situation 1
I would try to help them with what I could do for them. 1
I would try to help; IF I could. My own concerns would come first, though,as I have my own furbaby to care for & I am hoping I outlive her because of the way some people neglect their animals. 1
I would try to tell them how important they are, how tragic their circumstances and listen 1
I would try to understand and try and give him some resources and advice. 1
I would understand his feelings. I would be worried about him. I would try to help him. 1
I would use all of my knowledge in that field to assist them to find housing and make sure they had something to eat. 1
I would very much like to end this discussion please remove me from your messages 1
I would wanna help 1
I would want a permanent free home for families. Life isn’t cheap and keeping a home for a family is very important 1
I would want to be annomised 1
I would want to be anonymous 1
I would want to cry. 1
I would want to help 2
I would want to help anyway I could and if I couldn’t i would not feel could at but I wouldn’t give up I would still keep trying 1
I would want to help however I could for them. 1
I would want to help them 1
I would want to help them, as I have also been in that same spot. 1
I would want to help. 1
I would want to know I did my best 1
I would want to know would they love my child or look at them completely different 1
I would want to take the dog in myself 1
I would want to take them to a safe place 1
I would want to try and do ANYTHING I could to help get him and his children to safety. 1
I would want to try and help him. 1
I would wish it were true 1
I would worry that there would be a safe place for this amimal  1
I would would be able to go to sleep that night knowing they were safe for that night. 1
I wouldn’t be able to sleep at night 1
I wouldn’t be happy because I couldn’t help and I rather help other people than help myself last. 1
I wouldn’t buy milk from that company. I’m an informed consumer. 1
I wouldn’t do it for admiration, I would do it because it is something that needs to be done. People on youtube do these things for publicity, anything good that is done for other people should be done anonymously. 1
I wouldn’t do nothing I would do something 1
I wouldn’t do this 1
I wouldn’t feel anything. I would call security!! This. Test is bogus 1
I wouldn’t feel nothing 1
I wouldn’t know exactly what to say 1
I wouldn’t let that happen 1
I wouldn’t need him to say anything. Just knowing I helped is enough. 1
I wouldn’t sit them near a Garbage Island 1
I wouldn’t want them to feel embarrassed by my presence. 1
I wouldn’t want them to know it was me. 1
I wouldn’t. I already run an aid organization focused on bringing immediate aid for people in need, currently in Ukraine. 1
I wouldnt want them to feel they didnt deserve to be included in society, it alienates people with disabilities when these sports aren’t inclusive 1
I wouldn’t Not do anything. I would try to help 1
I wouldn’t do that body 1
I wouldn’t feel good 1
I’ d imagine that fisicly was a good time for all random blessings to evolve and very interesting and very informative to all because I know not sure if I can help but I would try 1
I’ would go all out to prevent dog from shelter 1
I’d feel much more optimistic. 1
I’d be ashamed 1
I’d be ecstatic that it was coming to fullfil ment 1
I’d be grateful for the trust that they have in me, and I would let them know that they are NOT alone. I would be honored to be able to help. 1
I’d be happy and touched 1
I’d be happy to see if it works. 1
I’d be happy to teach a child that it is ok to drink the milk from happy cows. 1
I’d be heartbroken. 1
I’d be off to the bookstore for a book and then I’d explain what public libraries are for. 1
I’d be proud of myself I help someone like it still have a life 1
I’d be relieved that we actually succeeded 1
I’d be so glad that I could help someone 1
I’d be trying so hard not to cry from joy at seeing that young man being so happy and free to be himself at last. 1
I’d feel as though I should help in some way. 1
I’d feel ashamed for not acting according to my values 1
I’d feel awful 1
I’d feel bad 1
I’d feel bad to not share some of the things I’ve been blessed with. 1
I’d feel good about that 1
I’d feel great 1
I’d feel great helping somone 1
I’d feel great. 2
I’d feel happy that justice is being done. 1
I’d feel helpless and sad 1
I’d feel horrible 2
I’d feel las if I let a brother down. I would want to help. 1
I’d feel like I had a tiny part in shaping his or her future 1
I’d feel like I helped them to find rewarding employment 1
I’d feel like a good human being again ❣️ 1
I’d feel like checking whether local rescues and shelters need money and how the money is spent–not that your charity is bad 1
I’d feel lousy 1
I’d feel pretty bad. Like I let my grandsons down 1
I’d feel proud 1
I’d feel proud that I was able to help the wolf animals 1
I’d feel so grateful that I was able to help 1
I’d feel terrible 1
I’d feel terrible and want to help. 1
I’d feel terrible if I could do something but took no action 1
I’d feel that I needed to help her and resolve that issue 1
I’d feel very sympathetic to their plight 1
I’d like to do what I can. 1
I’d like to find a charity that’s gets people off the street, housing and then into job training 1
I’d like to help local dog rescues. Easier to see how you can make a difference 1
I’d like to help, within reason. 1
I’d like to tell her where to get free birth control. I don’t have any children because I’m physically disabled. I realized that I’m going to be very, very poor for the entirety of my life so I sought free birth control. I don’t have any children that I cannot afford to feed. The most important thing I could do for a woman who had children that she cannot afford to feed i to help her if she chooses to not have any more children that she cannot afford to feed. 1
I’d make him/them pay 1
I’d make them feel that they çan still do anything 1
I’d never do that but If it did happen I would be devastated 1
I’d offer direction to help himself 1
I’d rather help the homeless, who I feel have a more immediate need for help than a soccer player. 1
I’d rather save penguins 1
I’d regret not helping 1
I’d say senior; you must now plant your feet in the ground 🪴 grow some strong roots to other cities and look for work 1
I’d say ““let’s find out how we can help.”” 1
I’d say I apologize for not trying hard enough to get the help you needed and that I wI’ll see what I can do for your village students 1
I’d say there were so many pressing problems, it was very hard to know what to focus on first or the most. 1
I’d show her Danica McKellar’s work. 1
I’d tell them I wish I’d gone to college took all the right courses so I could have tried harder but I did what I could for a mother in a middle class family.So they should change the world if they can. 1
I’d want to buy the markers myself. 1
I’d want to help as much as I can on a limited income. 1
I’d want to take the dog myself 1
I’ll feel proud 1
I’ll be a drop in a sea of good 1
I’ll be hurt 1
I’ll be okay 1
I’ll be upset, I would ask her to pack her clothes and take her to the bus station 1
I’ll check them out! Thank you! 1
I’ll do all that I can to help accomplish their dreams 1
I’ll help when I can.Im elderly and on a fixed income and am raising 2 greatgrand teenagers so I barely have enough to see us thru the month. 1
I’ll look for the organization. Thanks for the quiz. 1
I’m 60 years old and homeless and in bad health 1
I’m 65 need a place to live 1
I’m a cancer patient as I speak personally 1
I’m a person who 1
I’m always responsive to people in need I am a leader n have put numerous amounts of people ro work over the years 1
I’m am in the same situation 1
I’m being a blessing to someone,thank God 1
I’m blessed 1
I’m blessed when I can assist someone else 1
I’m broke 1
I’m broke sorry 1
I’m cancer free now but who knows it could come back 1
I’m def in support of charter schools and parents having the option and opportunity to choose the best education for their children whether it is charter, home schooling, college or vocational school 1
I’m done 1
I’m done now thanks 1
I’m done thank you 1
I’m done with this quiz 1
I’m done. Please stop. 1
I’m finished with you. Good night. GBWY 1
I’m finished, thank you. 1
I’m glad I could help. 1
I’m glad. 1
I’m going to feel bad 1
I’m homeless 2
I’m hoping the elephants have eternal good health, keeping the environment lush and safe. 1
I’m in low income as well,I have worked on 2jobs still trying to make ends meet,it is always a struggle,we do the best we can 1
I’m in that predicament now due to something out of my control 1
I’m indeed a good person And I will feel great 1
I’m looking for a different charity 1
I’m not Big on reading for real but if it means a Chile will learn from it then I’d decate my all 1
I’m not here for that 1
I’m not in to that 1
I’m not into imagining. 1
I’m not needing recognition 1
I’m not really in the mood for creative writing just now 1
I’m not really into having anything thank me for something everyone should just do 1
I’m not so interested in how it makes me feel as how it makes them feel 1
I’m not sure 4
I’m not sure how I would during the outcome. For now I’m homeless since 2019 stayed in the shelter for 2 years. Met a friend in there she had cervical cancer off and on she was going to the hospital since I moved out in 2021 I seen her off and on and she recover. SHe had moved from the shelter last year to her new place and haven’t heard her again. My prayers goes to her when I think of her daily. 1
I’m not sure this is for me. But thanks. 1
I’m not sure this is the best fit, I want to try the quiz again. 1
I’m on a fixed income 2
I’m opting out 1
I’m out of this thank you! 1
I’m retired and I have a part time job 1
I’m retired and low income. I get help myself. I can not contribute anything. 1
I’m so glad Lucy will be taken care of. I’m glad she has you. 1
I’m sorry here is soon food. 1
I’m still waiting on the name of the charity. Please tell me the name of the charity. 1
I’m sure I would be the happiest person on earth if I was able to help with Elephants. I absolutely adore them. One of my dreams was be able to help with Elephants. 1
I’m sure they would be very grateful for my help & I would feel fulfilled! 1
I’m sure they would say thank me and it would make me feel blessed 1
I’m terrified for my children to live in the world we are leaving them. The government is not doing enough. 1
I’m the person that needs the help 1
I’m through, thank you. I found what I wanted to know. 1
I’m too busy. I have other responsibilities. I must save for our daughter’s transplant. (I already give to HIAS) 1
I’m.ready.for.the.quiz 1
I’ve already donated based on your suggestion 1
I’ve already done this with my children! 1
I’ve been homeless. So knowing that anyone is homeless just breaks my heart. It just should not be happening in this day and age. 1
I’ve been in that situation and it’s a good feeling to have someone to reach out to help you like that 1
I’ve been in that situation myself and I would go without just to help a young mother be able to feed her children along with herself so that she may continue to take her of her children 1
I’ve been that mother I know how that makes me feel 1
I’ve been that person. It’s traumatic 1
I’ve been that young mother, searching through the cabinets . Now I’m the Grandma searching for myself. 1
I’ve been there 1
I’ve been there. And don’t want it to ever happen to US again. 1
I’ve been through this experience twice with cancer in my life and my sister. I know the caregiving aspect 1
I’ve been very blessed I’ve had no chemo I’ve had no radiation for some reason I didn’t need it I guess I got one of the best on ecology cancer doctor because she has done a great job in that document took out the stomach cancer I had and how are you and thank God that he was able to fix my rips to make wall and put my intestines back in me and now I’m digging my way out of this hole because what they give you for social security 9:30 a month make it hard to live on so how does this charity help people that really need it 1
I’ve donated many books children and adults. They are overjoyed and so am i 1
I’ve done my small part 1
I’ve laid off and have no training for anything else. 1
I’ve learned enough. I did not know about this charity, but I had guessed that my answers might have said Heifer International, which I already support. Thank you for introducing me to BRAC. 1
I’ve very little idea what that person would say. I doubt he/she would be hugging my legs in thanks for giving a few cents. 1
I’ve volunteered as a headstart tea her for a year from imagination to 3 years old but couldn’t deal with the abuse and the beating of the children and to have to take the children vack 1
I,’,d be extremely upset that they have no home to call their own! 1
IDE. Be. Very. Happy. Cavncet. A. Big. Thing. In. My. Familey 1
IF I DID NOT USE ALL OPPORTUNITIES, I WOULD BE A HEAL 1
INTERESTED 1
IS THERE ANYTHING I CAN HELP YOU WITH PUTTING THE KIDS TO BED BABE OR I WOULD GET UP AND HELP HER AS A TEAM 1
Iam not understanding any think please start from introduction and tell me what is about with charity navigator 1
Iam very honest so it would not hurt me any 1
Icanlive with children getting clean water and being healty 1
Id be upset 1
Id feed them 1
Id feel good 1
Id help her fine a home for her animal so she don’t worry as much 1
Id want to help as much as I could. 1
Idk 6
If I came across homeless Mom and her baby, I would do what I can to help her find the resources needed to provide her with a few nights stay while they look for a place more permanent. 1
If I can help I would feel good. 1
If I can help anyone because that person is someone’s son or daughter that are in need 1
If I could help I would but if I can’t I would feel some type of way 1
If I did nothing… shame on me 1
If I didn’t help I’m a terrible human being. 1
If I don’t have enough for me then how can I help you 1
If I fail to recover from this setback, the impact will be felt on my family for generations. How could you not help? 1
If I had a job and could support her awesome. Without work, I need someone willing to support my job search for a middle management job. 1
If I had it I would be sad 1
If I had known I would have been a better person, and help 1
If I had the means to take care of her dog I would bring it home with me. 1
If I have a good thing which can help her i can give to her 1
If I helped someone write a program that helped people get jobs, I would try to see what else I could do to help more people get jobs. 1
If I were in that position I would welcome any sourcing idea I could find to provide for my family.Thank God I only look out for myself.struggle is real. 1
If I wouldn’t do anything to help it would make me feel like a real piece of crap 1
If I’d contribute to the work that lead to the take down they would say you should have stayed out of our way, now you are in danger, I’d be very afraid. 1
If I’m going to be honest I have no clue how they would respond they could respond with a good answer which will make me happy or they could answer with a bad answer which would make me feel really sad 1
If a child who couldn’t read and didn’t have a single book and I was nearby enough for him/her to say something to me. What that child should say is: ““Why?”“. 1
If had could be able to save my life I would say Aman thank you Jesus 1
If it helped het good, if it didn’t help her bad 1
If it were in my means I would find out what their most urgent needs are and map out a strategy to meet those needs. 1
If it would help him to get a well paying job, I would be happy 😊😊😊 1
If my children thought that this works would be a good place for their children then I would be a grandmother, but as a result of this dream not coming true I will not have the opportunity to do so as they’ve chosen not to bring children into our ugly world and I understand and sorry them and their decisions. 1
If possible, I would give her some money to buy food for herself and her family . . . 1
If someone need help anywhere and I don’t help when I can I feel bad 1
If the child told me that they did not have any books, and either could not read at all, or could not read very well, it would not make me feel great at all. 1
If there is a person that needs food I try to help or tell them where there are food pantries or churches that give out food! 1
If they don’t have the money how will they have nutrition to survive if they don’t have a job or no resource that’s coming in to help them and people living in this world today doesn’t care about someone else feelings hungry thirsty or whatever but the government should step up and do better for the people and the people need to step up and do better for each other 1
If this is really an academic project then you should realize that your Navigator is garbage. I would never give to Amnesty International, which opposes what it sees as dictators on the right but not the left, and which is highly pro-Hamas and anti-Semitic. The choices you gave for a charity were incredibly biased towards the left. 1
If will make feel unhappy 1
If you can help, please do. 1
Ifs I have it I will help them 1
IhNe done a lot to prevent this i will do mre 1
Im here to help. How do I apply for membership to charity navigator 1
Im more worried about the child that sees no value in education 1
Im not really sure what to think about it. 1
Im too ou spoken and not shy 1
Imagine helping a wounded servicemember recover and live a full life in spite of battle injuries?: 1
Imagine not having a home 1
Imagine what they might say to me.. 1
Imagine what they might say to you 1
Imagine3what they might say 1
Ime speach less 1
Impactful 1
Important, like I made a difference 1
Impress 1
In a person that love kids concerns about mothers and their children keep them out the state show them how they supposed to treat their kids and the time of need or bad work they don’t have to worry about their kids I don’t worry about a daycare on worry about where kids can have special attention and love during the hours and time that their mothers are at work or someone that needs something to eat I can cook and feed the Homeless whatever I just love doing for people that’s my model always has been looking out for people and show them love cuz I’ve been a child before and I never had love I had to learn how to love myself 1
In that part, I have to give a realistic thought, I can not come up an exact answers yet… 1
In the first place, I would give them out of my own supplies and try to HELP her find help. 1
Inadequate 2
Incredible 2
Incredible, as I’m a cancer survivor 1
Incredibly happy and warm that the dog has been taken care of 1
Indolent 1
Ineffective 1
Information in question format incomplete 1
Informed and empathetic ready to alert authorities 1
Inot good 1
Insignificant, unseen 1
Inspired 2
Inspired to support a way to get books for everyone! 1
Inspired, motivated to help 1
Insulted and ashamed 1
InterFaithWorks 1
Interested in learning more 1
Interesting. 1
Irealywhouldfillhurtandletdown 1
Irrelevant 1
Irresponsible 3
Is important 1
Is it public education 1
Is there anything you can do? I would feel upset if I did not have resources to help. If i knew of a nearby food pantry or helpful church I would ask if they could get there. 1
Is this a scam of some kind? I’m not getting answers. 1
Isend donations monthly to ASPCA and Humane society. 1
It a very hard job 1
It all sounds good but this questionnaire is not helpful. 1
It always makes me sad that people are in these situations in the first place. 1
It brings me to tears. I want no animal to be homeless hungry or abused 1
It definitely wouldn’t make me feel good about myself 1
It doesn’t matter to me what they would say to me. It only matters how they feel - are they happy, feeling seen and cared for. 1
It doesn’t matter what they say to me or how I feel it’s about doing the right things 1
It feels wonderful. I spend each Tuesday cooking and feeding the homeless 1
It food stamps in checks from the state to help them out until he can get another job 1
It has NOT given me the name of a charity! Great quiz. 1
It has and would make me sad I have been on both sides and been the girl looking for something to feed my baby and no help so I have alot of empathy for young mothers or hungry and homelessness 1
It is not Christian to turn away the homeless and the hungry, I try to follow Christ is what charities I give to. 1
It is not clear to me who ““they”” is in ‘imagine what they might say to you.’ Assuming they is the young activist, I would feel like I had not done enough. 1
It isn’t at all how I feel. I want them fed and to have at least the basics to make it through a week. 1
It make me feel bad yes 1
It make me feel great n positive about the environment and my life n my family’s life also 1
It make me fill hurt with tears sad 1
It makes me feel bad and they might tell me at least to get any means of transport for easy going to school and coming back home 1
It makes me feel good and proud. I’ve been homeless for the last 2 years and I feel unbarrassed, humiliated and degraded 1
It makes me feel great 1
It makes me feel great.Im interested in helping in paying bills for the people that’s in poverty. 1
It makes me feel like I’ve been drawn into a manipulative conversation 1
It makes me feel like doing the work of GOD 1
It makes me feel sorry 1
It makes me feel very sexy 1
It makes me sad and I want to help find aftercare for the dog. 1
It makes me think 1
It pains me. 1
It probably would make me feel good 1
It should never be allowed to happen. These animals have feelings and souls. Their lives should have meaning and happiness. 1
It will be a shame 1
It will feel bad 1
It will get better. 1
It will make me feel Horrible 1
It will make me feel bac 1
It will make me feel good for being able to help them. 1
It will make me feel good if I’m able to support and help her help with the situation 1
It will make me feel horrible I would find more money by the way too make this treatable 1
It will make me feel sad 1
It will make me feel totally awesome 1
It will make me sad 1
It will me feel so good. 1
It will me sad and I would want to help her 1
It will mean a lot to me and my soulmate I love him. And I want the best for us both. 1
It wood make me feel so good 1
It would make me feel.bad for them and I would do all I could to encourage them to stay positive and kmow there was always hope that things will get better 1
It would make me so proud because he would be able to feed his family and others who needed help! 1
It would be a great start for me. 1
It would be a miracle 1
It would be a special thing for somebody to take care of a dog and love and protect it and 1
It would be a step towards the dream job that I have wanted most of my 77 years. A philanthropist. 1
It would be an improvement 1
It would be awful 1
It would be fantastic. 1
It would be gratifying 1
It would be great I’d be very proud. 1
It would be great if a person learns a way to keep themself afloat on a day-to-day situation. 1
It would be heart breaking 1
It would be like reliving my own love of reading. 1
It would be nice to be fully prepared on what to do 1
It would be ok 1
It would be perfect 1
It would be so sad 1
It would be the meaning of a successful life. 1
It would be very rewarding. 1
It would brake there harts I was that kid never had $ are a teacher to take the time and teach me how to read because I was not able to hear out of my ears growing up therefore teachers would not take the time to teach me properly how to read and write therefore it calls me to not be able to learn properly that is the lack of teachers teaching their classes and learning their children’s disabilities and their strength and their weakness that falls back on teachers not caring enough about their jobs and being able to let these children thrive and push them to the max of what they’re capable of being in this world and being able to achieve 1
It would break my heart 2
It would break my heart because I’m in the same situation as the old lady. 1
It would break my heart that they had no access to books. Worse would be if they didn’t realize what a loss it would be. 1
It would break my ❤️ but il try my best that those children get something to eat 1
It would depend on if they got a job! 1
It would depend on the circumstances Not guilty 1
It would depend on why I couldn’t (not wouldn’t), but I’d feel uneasy. 1
It would do my heart good 1
It would encourage me to continue helping. 1
It would feel amazing to know I had been instrumental in helping to save the environment. 1
It would feel good 1
It would feel great 1
It would feel great but can I take the test again? 1
It would feel great. 1
It would feel quite awesome 1
It would fill my heart 1
It would frightened me 1
It would give me a peace of mind knowing that I could help them 1
It would give me satisfaction 1
It would hurt me deeply 1
It would hurt me to know that I am not doing what I need to do 1
It would makd me feel great 1
It would make Me extremely Happy To see Someone succeed 1
It would make feel awful I would try and get her into a shelter right away. To be honest with you I work with the homeless now and there are not enough resources for the homeless and not enough shelters. 1
It would make feel less of a person, know God makes no mistakes 1
It would make me angry and sad at the same time 1
It would make me angry that whoever he works for doesn’t take care of him when he has a known complication endemic to his workplace. 1
It would make me b a selfish low down person!! Offer advice or give info on what I know about places that would help them!! Give money and or food 2 help them 1
It would make me cry knowing I helped save animals in need 1
It would make me feel wonderful 1
It would make me feel Horrible 1
It would make me feel I gave to save so many after I am gone. I am 76. I have another charity near my heart saving feral cats and abandoned animals. (Dogs). Also, wild life. 1
It would make me feel I made a difference and saved another life. 1
It would make me feel Luke a failure 1
It would make me feel about the same as when a former Shriners Hospital patient thanks me for his or her even though I had very little to do with it. 1
It would make me feel accomplished 1
It would make me feel amazing I have to give God all the credit 1
It would make me feel amazing that I was able to make some feel safe, comfortable and happy. 1
It would make me feel amazing to know I help save an animal 1
It would make me feel appreciated for my small action but sad that couldn’t do more. 1
It would make me feel aweful 1
It would make me feel awefull 1
It would make me feel awesome 2
It would make me feel awesome. I have been homeless and it’s nice having somewhere to go when you’re at your lowest 1
It would make me feel awful 2
It would make me feel awful so I would have to help him 1
It would make me feel awsome 1
It would make me feel bad 1
It would make me feel bad bc that a child wasn’t able or know how to read bc I love to read 1
It would make me feel bad for the man 1
It would make me feel bad that Lucy would be without a home. However, money can be set aside for her care and Lucy can be sent to a breed specific rescue that could provide for her needs. Any funds that are donated can help offset the funds needed to care for Lucy until a ““forever”” home can be found. 1
It would make me feel better about myself 1
It would make me feel better and I helped out the family 1
It would make me feel better knowing that I have been absolutely able to help someone else because I am already blessed to have my own needs met actually I have been volunteering to help as much as possible with the very situation of housing and homelessness since I was in high school 1
It would make me feel better to have helped 1
It would make me feel fulfilled. 1
It would make me feel glorious! 1
It would make me feel good 8
It would make me feel good knowing that another person and her kids are in a safe place, we should have more shelters for the homeless.⁰ 1
It would make me feel good and happy 1
It would make me feel good and sad that she would be gone 1
It would make me feel good inside to see some family have good filling food. 1
It would make me feel good knowing I helped someone 1
It would make me feel good that I assisted. 1
It would make me feel good that I was able to help them 1
It would make me feel good to know i was able to help 1
It would make me feel good to know we help her get out of legal human trafficking I say this because government is getting paid to hold a innocent person against their wheel just for money 1
It would make me feel good to no that they are well an not hungry anymore. 1
It would make me feel good. 4
It would make me feel good. This is a charity I have donated to before. I have also donated to food banks that, I believe are affiliate with this charity. 1
It would make me feel great 3
It would make me feel great and happy that it got a new home. I would also feel very proud of myself. 1
It would make me feel great knowing that I helped in some little way 1
It would make me feel great that I could help her as it has happened to me and it’s not fun living with out roofing and not knowing Day after day what would happen to me every one ñeeds a chance to sleep safe feel safe 1
It would make me feel great that I could help. 1
It would make me feel great to know I helped an elderly woman and the dog. 1
It would make me feel great! 3
It would make me feel great. 1
It would make me feel greatly disappointed for her. But, I would suggest that she still fight and never give up. No matter how grim/bad the news is. There is always hope.; 1
It would make me feel guilty and would probably adopt Lucy myself. 1
It would make me feel guilty, I always feel guilty about my good luck 1
It would make me feel happy 1
It would make me feel happy and blessed that I could help someone. 1
It would make me feel happy that I was able to help 1
It would make me feel happy that i was able to help him. 1
It would make me feel happy to brighten some one day 1
It would make me feel helpful. 1
It would make me feel helpless 1
It would make me feel hopeful that humanity finally got the point and learned its lesson 1
It would make me feel horrible about myself. Why can I, as someone well-off, get a good education while they can’t because of something so treatable? 1
It would make me feel horrible. Children should understand where their food comes from. 1
It would make me feel invisible! 1
It would make me feel like I am doing what Christ asks of us. 1
It would make me feel like I am making a difference in making someone’s life better. 1
It would make me feel like I did something helpful and useful toward making this world a better place. 1
It would make me feel like I have made a difference to her life 1
It would make me feel like I made a difference in a positive way. 1
It would make me feel like I wanted to help her daughter have the opportunities my daughters have had. 1
It would make me feel like I wanted to help, to be able to direct this person to a known agency where she can get assistance. 1
It would make me feel like I was making a difference 1
It would make me feel like I was not upholding my values or moral philosophy, engendering guilt and diminishing my hope for a better future. 1
It would make me feel like I’m a person who cares only for herself and forget the one in need 1
It would make me feel like I’m helping someone survive. It would feel good. 1
It would make me feel like a loser that I wasn’t much of a parent 1
It would make me feel like crap I will help anybody if possible 1
It would make me feel like foundational change needs to be made to his school. Instead of stealing the best and brightest from the public system, resources need to be focused on shoring up the foundational problems in our public system. Not eroding it further so the least served w/ the least parental involvement get left farther and farther behind. 1
It would make me feel like they would agree and wonder 1
It would make me feel like, this isn’t what God would want from me 1
It would make me feel ratified 1
It would make me feel real good 1
It would make me feel real good. Knowing that this animal had a new and loving home instead of being enthused. 1
It would make me feel really bad you know I’ve been in the same kind of position you know nobody really reached to hand out for me and then they did. It was always like go for short time and you know I did the best I could and any money I cleaned the house. They weren’t appreciative of it. You know is that she’s a lot better dealing with the fucking bullshit you gotta deal with when people just become so forwardof work you like a slave 1
It would make me feel really good knowing that she was going to have a good meal there’s not a better feeling then helping people in need 1
It would make me feel really happy 1
It would make me feel sad and compassionate. I would want to help but not know how 1
It would make me feel sad and guilty, which is why I am deliberate about contributing to causes I believe in, both foreign and domestic. 1
It would make me feel sad for the dog but happy that the dog is taken care of. I would be anxious because I’d be worried Lucy might be scared in her new home. 1
It would make me feel sad n inadequate. 1
It would make me feel shitty 1
It would make me feel soooo good!!! I have been through so much in my life! I have been physically, emotionally and mentally abused!!! And left without a home and money…. 1
It would make me feel terrible 1
It would make me feel terrible and I would want to fugue out how I could GET the Help that we neede 1
It would make me feel terrible because people would be disappointed in me 1
It would make me feel terrible. On Fridays 3 of us did Fri with donuts with in a housing project 1
It would make me feel that I am making a difference in my world. 1
It would make me feel that I had done something worthwhile. 1
It would make me feel that I need to help in any way I am able. 1
It would make me feel uncomfortable 1
It would make me feel upset because I couldn’t help him 1
It would make me feel very appreciated. 1
It would make me feel very bad. I am not in a financial situation to help her. We have so many millionaires in this country that could be able to do something 1
It would make me feel very good about myself even more. 1
It would make me feel very good. 1
It would make me feel very happy 1
It would make me feel very happy that she and her child were safe and warm. Then I would 😁 smile! 1
It would make me feel very like everyone deserve the right for help anyway shape form or fashion 1
It would make me feel very proud 1
It would make me feel very sympathetic 1
It would make me feel wonderful that I was able to help. 1
It would make me feel wonderful that a mother would be able to feed her children. If she is a working mother with no husband to help, I know she is doing the best she can to provide for her children. I’m sure she would be very grateful for any help. 1
It would make me happy 1
It would make me happy and hopeful! 1
It would make me happy because I always wanted to cure children that are sick 1
It would make me happy to help people and children that need help , we all need help 1
It would make me happy to help someone else in need 1
It would make me happy to know that I was able to help 1
It would make me happy, however I would like to be a part of the person’s journey of learning to read the book. Not just giving money. Time and effort are more important to me. 1
It would make me jealous cause I need a home 1
It would make me mad if a coach told them that and I would comfort the Down’s syndrome. 1
It would make me pleased to have accomplished it. 1
It would make me proud of myself for helping people 1
It would make me proud. I would be thankful that my efforts produced a positive outcome. 1
It would make me sad that the government didn’t step in to help. 1
It would make me saddened that I could not help them. 1
It would make me so happy and excited 1
It would make me so happy to know something I suggested helped someone!! 1
It would make me so happy 😊 that I was able to help someone. 1
It would make me sooo happy and proud to have contributed. 1
It would make me very happy 1
It would make me very happy to know I can make the dog transition to a new owner and a new life 1
It would make me very sad I have a cat named Lucy 1
It would make me very sad and ashamed 1
It would make me want to be part of the solution! 1
It would make me want to do something for her, if possible. 1
It would make me wonder why I did nothing to help 1
It would make my heart full and very happy. 1
It would make my heart happy and excited. I would probably jump up and down 1
It would make my heart hurt. 1
It would matter 1
It would mean alot it is very important that everyone learn at a young age to respect and love and be kind to precious animals they r so innocent in this world 1
It would please me a great deal especially if I could help her learn to teach someone else to feed their family 1
It would really make me feel bad for him because I’ve been in that situation before 1
It would suck 1
It would suck. 1
It wouldn’t good 1
It wouldn’t happen because I would make sure that I gave her food even if it was mine 1
It’s not about me but us. Whatever we do or don’t do, the result is based on the laws of thought. God or karma. So we do a deed and it help the God glory is the story or God use us for glory. If the result work out bad then it’s a lesson to blessing if we our lesson. 1
It’s about time! I would be pleased 1
It’s breaks my heart 💔💔💔 to think that it happens on the regular today. And I think by the time my grandkids are of age to understand all about what goes on in the wild with these animals . I don’t think my grand babies will ever see an elephant in his time. The catchers are out there cutting there tusks and selling them to make ivory out it. And they do it for thee all mighty dollar. This is a very sad world 🌍 we are living in today. We NEED JESUS NOW!! RIGHT NOW!!! AMEN!!💔🙏🏼🙏🏼🙏🏼🙏🏼🙏🏼🙏🏼🙏🏼💔 1

It’s great to know I am not alone.

Makes me happy knowing I helped someone in need.
1
It’s hard for me to imagine that at all 1
It’s more important, I can make me feel bad 1
It’s my pleasure to have helped you. 1
It’s not about how it would make me personally feel but the animals. Just knowing I’ve attributed to helping them would be more than enough recognition for me. 1
It’s not about me and as long as I can help them I will be trying 1
It’s okay I’m here we can find your forever home 1
It’s really convenient 1
It’s so sad 1
It’s worn and broken but please give it to someone else who will have good use of it. 1
It’s would make me feel like someone cares about me be amazing 1
Its good to hear the responsible of Everone 1
Its not easy to help everyone but you have to start one at a time 1
It’s all part of my duty. I don’t do it for the praise I do it so they can enjoy it and pass it on 1
It’s important to respect animals in their environment. 1
Ive done it 1
I’d be thrilled that the student’s life was so positively impacted 1
I’d be embarrassed 1
I’d feel crappy if I had ways to help, they wanted it and I did nothing! 1
I’d feel fortunate to be involved with this exchange 1
I’d feel good because I am a giver! 1
I’d feel grateful that I was able to help this happen. 1
I’d feel inspired 1
I’d feel joy. 1
I’d feel like I made an important difference in both of their lives. 1
I’d feel sad but instead of giving to an individual I’d give to Salvation Army or Star of Hope. Tell him to go to (SA) for assistance. 1
I’d feel sad for him and want to help. 1
I’d feel sad. 1
I’d feel terrible 1
I’d feel useless 1
I’d feel very bad 1
I’d feel very sorry for the woman and her situation 1
I’d find justice for her 1
I’d imagine I would feel like my contribution made a difference in that child’s life 1
I’d rather help animals. Needy shelters. 1
I’d still prefer the child not be drinking milk, but it’s better than the current system. 1
I’d want to help them get training to learn another job and keep family safe and fed 1
I’ll stick with St Jude 1
I’ll take Lucy when the time comes. She will become my child 1
I’ll tutor you. 1
I’m Actually familiar with Trevor Project and support it 1
I’m a retired nurse an my daughter has cancer 1
I’m already giving to ASPCA 1
I’m done with Texting! Thank you, gracias! 1
I’m done. 1
I’m done. Thank you. 1
I’m done. thanks. 1
I’m going through an eviction and I’m going to be evicted on December 26th! I went to several government agencies and they told me that I don’t make enough money for them to help me, and my family and 2 dogs! I’m 58 years old and I have never asked for help! Besides Medicaid! I went to them Friday and was told my case was closed ! And I don’t have Medicaid anymore!! All they are doing is giving me is $90.00 in Snap! I started applying for help in September and never met or even saw what my caseworker looked like! And was not advised that my case w closed!! So I would never be in that position! If that were to happen to me now in my situation I would do anything for them!! 1
I’m going to give to them. Thanks. 1
I’m happy Lucy will be taken care of 1
I’m leaving the chat. Goodbye. 1
I’m loss for words 1
I’m more concerned for the souls of these people. 1
I’m more interested in High School kids 1
I’m not interested 1
I’m not into feelings! I’m an intuitive thinker. If you tell me that the program really works and I helped - THAT is my motivation. 1
I’m not looking to be thanked. I just want to give to quality charities 1
I’m not sure 1
I’m not sure I follow this question. 1
I’m so glad i was able to help you. God Bless You and Your Family. 1
I’m so glad to have a warm place for my child tonight. It would make me grateful I was able to help. 1
I’m sorry. This does not sound like what I am interested in 1
I’m terrible at that 1
I’m that’s the same situation me and my husband are in now, kind of because I’m on sick leave and he’s only not getting any overtime, I guess we would have to either sale our house or borrow money from are mortgage bank 1
I’ve been an educator for forty years and have seen its power. I love helping kids meet their goals. 1
I’ve been in that position before so I just had to pray and keep going better application doing the best you can I’m 70 years old. I started 20 years ago when I was 50 so you could imagine where I’m at now only making $15 an hour OK 1
I’ve done this. I’ve been a social worker for 30 years 1
I’ve done what I could over the past 45 years to help slow down the deterioration of our climate & environment, and to make personal choices that help protect our planet. But it will take EVERYONE, all pulling together, to save us. To save our planet, we must start with saving the oceans, which are filling up with toxic wastes & plastic. There are enormous Dead Zones in the oceans now, and areas 100s of miles across that are just plastic waste. We must reverse this damage! 1
Jean 1
Jjn 1
Joy in my heart i believe we can end homeless more then a night 1
Joyful 2
Joyful? 1
Just like human children who need shelter, food, love and attention, animals need the same. And, just like human children, they rely on human adults to give them what they need. It’s our responsibility to ensure a full and meaningful life for those who are helpless to help themselves. I’m thrilled to be a part of an organization who provides this to those in need. 1
Just made donation 1
Just seeing the smile in there eyes is enough for me God has blessed me so I try to give back to those in need 1
Just sent 1
Just want to know I I have a friend 1
Keepgoing I’d have to say 1
Kind of shitty 1
Kinda sad 1
Know that I directly contributed to a good cause. 1
Knowing the answers and the information behind the answers. 1
L 1
LIKE I AM DONE WITH THIS SURVEY <> THANKS !! 1
LOVE IT 1
Learning a trade will make my live, my community, my children improve our lives. 1
Leave 1
Let them have it 1
Let’s pray 1
Let’s get you a warmplace to stay and something to eat 1
Lets say this if i knew someone was hungry i would feed them .. if i had a job and they could do it i would let them work… and train them… so does that answer you question 1
Let’s pray to Jesus for protection! 1
Let’s see what opportunities available 1
Like I accomplished something 1
Like I am helping…. 1
Like I am doing something worthwhile 1
Like I am into a Logos, Pathos and Ethos argument 1
Like I am making a difference. 1
Like I am part of the solution. 1
Like I contributed 1
Like I could have helped but didn’t 1
Like I did a small part of a huge project that will never be completed 1
Like I did something good 1
Like I did something important 1
Like I did the right thing 1
Like I did what suppose to do 1
Like I failed him 1
Like I forgot where I came from 1
Like I had accomplished something real 1
Like I had done something important 1
Like I had made a difference in their ““forever”” world 1
Like I had walked away and ignored the opportunity. 1
Like I helped someone like me when my child was small, and I was alone. 1
Like I let her down 1
Like I made a difference 7
Like I made a difference in her life 1
Like I made a difference in their life 1
Like I made a difference, even if just for one. 1
Like I made a difference. 1
Like I met her #1 need 1
Like I need to rell them a story I’ve read, then get them the book. 1
Like I need to support Hadassah that has global impact 1
Like I really made a loving difference 1
Like I said, I will THINK ABOUT IT. 1
Like I should have done more 1
Like I should have done something, even something small. 1
Like I was ACTUALLY DOING SOMETHING 1
Like I was a mini saviour…. 1
Like I was being helpful. 1
Like I was helping people and animals 1
Like I was making a difference 1
Like I was making a difference in their 1
Like I was making the world a little brighter 1
Like I was modeling the behavior I’d like to see in them 1
Like I was where God wanted me to be. It wasn’t me it’s he who lives in me 1
Like I’d done something good 1
Like I’m living my Faithn 1
Like I’ve done something to make this person feel good knowing her girl will be taken care of 1
Like I’ve helped someone in need 1
Like a Hero!!! 1
Like a chump 1
Like a decent person 1
Like a grown up. It’s what an adult does. Unfortunately we have many grown up children these days. Don’t get me started on that. LOL 1
Like a hero 1
Like a million dollars 1
Like a piece of shit !!!!!!!!!!!!!!!! 1
Like a real asshole 1
Like a schmuck 1
Like a terrible person 1
Like crap 2
Like crap I would find some place for her to go 1
Like crap. 1
Like doing something 1
Like from so far away I helped their world be a tiny bit brighter. 1
Like garbage 1
Like helping 1
Like helping is the right thing 1
Like i hlp someone who needed it 1
Like i made a difference in this families life 1
Like my actions made a positive impact on someone. That would make me feel good 1
Like my help had enabled them to continue safely on their path to a better life. 1
Like my time here wasn’t wasted! 1
Like reading IS fundamental. 1
Like shit 2
Like shit probably 1
Like that young man wasn’t given a chance to do their best. 1
Like the worst person in the world 1
Like there should be something to help. 1
Like what I did was actually making a difference, not simply putting a bandage over the real problem 1
Like 💩 1
Living safely and free is good for all wild animals. 1
Look I’m sorry I can’t help I live with M.S. that is Multiple Scolosis I’m on s.s. and that’s not much so sorry I can’t help bye bye 1
Look for another job 1
Look for ways to connect that family with others that have an appreciation of reading. 1
Look in the fridge to see what is in there 1
Look this baby needs love like she or he has always known can you please tell me that you can do the true love ? 1
Look what I tell you us true 1
Losing my mother she died she was 73 and I wanted her to be healthy I’m sure daughters charity Gallagher on her daughter of her but she’s the only one to take care of 1
Lousy 3
Love it 2
Lower than life & embarrassed 1
Lucky that I currently have a few tabs open re: how to establish a trust for your pets. 1
Lucy would come to live with me. 1
MAKE ME FEEL HURT AND BAD NOT TRYING TO HELP 1
Mad 2
Mad at myself 1
Mad at myself for not helping 1
Make him feel wonderful about himself. Value’s 1
Make hreat 1
Make me feel at peace with myself that I helped someone in need bc I’m how it is to b in a shelter and just one person who will bless you with warmth and a safe place is such a blessing and it warms my heart 1
Make me feel bad 1
Make me feel good 1
Make me feel like a real hero 1
Make me sad. I prefer a charity that allows hands on work not just giving a check 1
Make me want to cry 1
Make me.fill great 1
Make the bike a reality 1
Make them get back on their feet 1
Makes me feel happy and fulfilled 1
Makes me feel really good. But let’s safe Elephants from poachers 1
Makes me sad and kinda wanna start some research on how he could get some training for a new career 1
Makes me sad. 1
Makes me sick 1
Making an impact on an individual 1
Man that really hurts in my heart and gut my throat is tightening as well and I’m feeling puke arise in my throat . I would want to protect a animals why isn’t there help foe this lil dog im useless I agree 1
Man this is manipulative as hell. Not the turn I was expecting this to take at all. 1
Many things… Angry that a service he pays for refused to do what it was intended. Grateful that I was able to help. 1
Mass shelters are not what I want to help, more like help for the homeless who are in camps and along the roads. Shelters don’t help just make dollars for the provider. People need a place to call home while getting themselves to a place where they can find a real permeant home. 1
Maybe later 1
Maybe like I helped someone make a better life for themselves 1
Maybe volunteer at an animal shelter 1
Me not helping! I would kick my arse 1
Meaningful 1
Meeting a need 1
Might thank me and I would feel great to be able to help someone 1
Miserable 1
Miss YOU! GREAT!😉 1
Mix of frustrated and sad. 1
Money donated to ASPCA goes to the people running it. 1
More interested in birds 1
More interested in charity for autoimmune illnesses. 1
Motivated 3
Motivated to change their situation 1
Motivated to get them a set of books 1
Motivated to make sure she gets 5 more books, has access to a library, and support at home to encourage reading more 1
My daughter. Died from a. Now. My son hearty. Attack 1
My financial donation was working where I can not physically be present. It would give me a sense of satisfaction and knowledge that justice is possible. 1
My grandchild is 33 years old she’s well aware of what’s going on in our country it’s terrible and it’s sad there is many things to be aware of not just focusing on that charity there’s many charities that need to be focused on and needs to be brought up and taken care of especially for the homeless animals and caring of them these nonprofits need to be a non-profit and quit profiting off the dogs and cats it’s ridiculous and the spay and neutering is ridiculous especially in Yakima Washington I have never been to such a terrible state in my life that people don’t stick together and come together and have clinics and stuff for low income in the homeless people so they can keep their animals I see so many dead animals alongside the street and they don’t care they just keep on running over 1
My grandchild would probably not understand what progress had been made. However, I would feel I had lived an effective life. 1
My grandchildren are adults and I don’t think all the forests are gone yet. 1
My grandchildren are all adults now, and we talk a lot about environmental causes. 1
My grandchildren are clueless. I do this for my own sense of right 1
My grandchildren know I am already engaged in various efforts to address these issues but I will also give some thought to contributing to the Natural Resources Defense Council. Thanks for the recommendation 1
My grandchildren would be proud 1
My granddaughter is working on her PhD in Sustainability. 1
My grandfather died from a third heat attack when I was 7 years-old It was 5 years after my father was killed on his job at the age of 28 . My mother was in tears that day because her daddy was dead from the heart attack 1
My grandpa said in New Mexico their is an apple with the seeds that cures cancer 1
My health isfragile 1
My heart would swell 3x its size. 1
My home 1
My husband and I both lost our jobs at once back in the 70’s. That’s scarry. 1
My kids aren’t going to have children. They are both concerned that in as little as their children’s or grandchildren’s generation the point of no return for the Earth’s climate. I share their concern. 1
My mom is passed away 1
My money won’t change it, I just can hope it helps 1
My mother is a teacher and my sister is a teacher so I have first hand exposure to what teachers really get paid, what it is really like being a teacher 1
My son has a life threatening disease ignored by most 1
My son is going thru Gleoblastoma, that’s why I send money to St Jude. I will look into Dana-Farber. 1
My wife has beaten cancer 4 times in 19 years we have been together We went to UCSF HELLEN DILLARD CANCER CENTER in San Francisco, California Actually she had cancer last year now it’s been one year cancer free It is a very hard road to travel alot of ups and downs and treatment sucks for everyone the patient and the ones who have to watch then go through treatment because there is nothing we can do to help Just make them comfortable as possible and make sure they eat something I know this because I have seen through this many times 1
My will would be for my pets care 1
My young grandsons are very witty and would tell me what they think instead of the other way around. 1
N/A 1
N/a 1
NIGGER 1
NO 2
NOT AT ALL. PLEASE REMOVE ME FROM YOUR CONTACT LIST. 1
NUMBER ONE I WOULD HELP THEM OR PUT THEM UP FOR ONE NITE AND IN THE MORNING I WOULD HELP HER FIND HELP. 1
Naturally, I would feel great! But in many states, there are not many adequate programs to educate, train, house, and financial assistance.. Special Olympics is something that many corporate and community groups can get behind and feel good. But for most of the disabled, nothing really changes 1
Need the address to mail fonation 1
Need to help 1
Need to know more 1
Needed 3
Never contributed to Feeding America before. I give regularly to my local foof pantry network. 1
Never gave th if s a thought 1
Never heard of the organization - how much of the funding goes to program? To admin? To fundraising? 1
Never mind 1
Nevermind 1
New test 1
Nice 1
Nice and worth cause 1
Nice good 1
Nice man 1
Nice. Humbled. 1
No 16
No I stopped on purpose. 1
No $ 1
No I’m done 1
No but thanks 1
No comment 1
No grandchild, don’t want kids. Plenty of other people to have em. 1
No grandchildren. But I am currently supporting nuclear energy, which is an important part of the solution. 1
No grandchildren. I do what I do for the environment because I am part of the web of life and I want to be a positive force. 1
No idea 2
No idea what they’d say to me 1
No idea? 1
No interest in supporting this charity 1
No one takes trees away needed to preserve animals and US 1
No one won’t suffer 1
No one would have to say anything, I would be beating myself up mentally for years to come. 1
No please remove me from this 1
No questions asked I would want to take care of the Lucy. It would break my heart if she were to be put it in a shelter… She might die there 1
No rather not 1
No reply, thank you. 1
No response 2
No thank you 2
No thank you I just lost interest. 1
No thank you. This was not the charity choice for me. 1
No thanks 7
No thanks STOP 1
No thanks. 1
No thanks. I support Makindu Children’s Center 1
No 👎 1
No, I want them to have a HOME, not just a shelter 1
No, probably it does not. Almost all dairy cows and their babies live bad lives. BUT. You don’t have to drink milk that comes from cows! There are many milks that taste just as good and come from plants! 1
No, thank you 1
No. I’m done. 1
Nonplussed. 1
Nope 3
Nope. 1
Not very good 1
Not a good feeling. 1
Not a understanding member of life 1
Not a valid question as I have no children and at almost 60 do not plan to start now 1
Not all places of business are receptive to AED. They hesitate because of possible lawsuits, the snout of time to educate their staff. Or possibility of the staff being able to follow directions 1
Not anomous 1
Not do good 1
Not for me 2
Not going to 1
Not good 12
Not good but motivated to clean up. 1
Not good i 1
Not good. 1
Not good. She would need to share her need with me 1
Not good. Shelters are not the answer. 1
Not great 1
Not great! 1
Not guilty 1
Not in my skill set 1
Not interested 5
Not interested in charter schools 1
Not interested thank you. 1
Not interested. 1
Not interested. Sorry thanks for charity tip though 1
Not my vision 1
Not needed 1
Not now 2
Not really impressed 1
Not really sure how to answer this 1
Not sure 5
Not sure of my answer…..would have to think a long time about it…. 1
Not sure probably bad but wouldn’t know how to help 1
Not sure this one is for me 1
Not sure, most shelters are scary places. 1
Not sure. 1
Not surprised at all are medical systems sucks 1
Not the right match 1
Not to bad 1
Not to blame 1
Not to good 2
Not very good 1
Not very good! 1
Nothing 1
Nothing. Why would they speak to me? How would they even know I didn’t help? or that I even could help? 1
Number one I would help them make me feel bad if I didn’t 1
Number one I would never do that I would help her I’m not the type of person that would do nothing 1
Nunya - as in Nunya Bidnez. 1
O 2
O will still try. To help them read 1
OK 2
OMG I would feel so blessed to help someone like that 1
Obviously, helping people is a great mood lifter and contributes to happiness. 1
Obviously, it would make me feel good. 1
Obviously, it would make me feel good……that I helped in some small way 1
Obviously, not doing anything would feel terrible. 1
Of course I would be glad to hear that I had helped, but I would also wonder why she needed to thank me. Systemic injustice caused her “bad luck,” and systemic injustice caused my “good luck,” so at most we’ve taken a small step to even things out. 1
Of course I would feel awful, but I am not indifferent, just not wealthy enough to make a big difference with lavish donations. I wish it were otherwise, but governments and corporations must become more responsive and held accountable. 1
Of course it would make a person feel good 1
Of course, I feel good 1
Of course, good. 1
Of course, it would make me feel like an irresponsible self-serving piglet. 1
Offer encouragement and try to find resources. 1
Offer to buy a few neccessary items 1
Oh I already have 2 adult children who are homeless. 1
Oh my goodness sad 1
Oh no 1
Oh please 🤬 1
Oh, I will do my best to help them find shelter! 1
Oh.I see. 1
Ohh, this is the research part. I resent guilt. It would be more effective to ask me directly. 1
Ok 25
Ok I’m done here 1
Ok how would I be able to help him 1
Ok that makes me feel great 1
Ok your own welcome rg I ss is tour ppalabet bow guh 1
Ok, I’m getting tired. Thanks. 1
Ok, thanks, that doesn’t answer my remark at all 1
Ok. I feel drawn to the ‘unseen’ disabilities like Austin’s 1
Ok. I’m done 1
Okay 8
Okay I have what I need - no hard sell needed. Thank you 1
Okay but I usually donate to animal causes 1
Okay stop 1
Okay, I understand how you feel. Does your wife work? Okay with her income and we will help you to apply for unemployment which should help your income while you are training to better yourself for a better position. 1
Okay, I don’t know what you want me to do here. I’m supposed to imagine talking to what? Still waiting for my charity match 1
Okay. A feeling well done. 1
Old news I’m legally blind freedom from terrorism inflicted upon me by 2 sisters :( 1
Omg . 1
On top of the world 1
One more accomplishment for humanity 1
One of my goals is to leave the next generation a healthier place to live. 1
Only I Would Do What I Can To Help. 1
Opt out 1
Opt out. 1
Optimistic but ready to take action 1
Or hers 1
Or woman. I would feel sorry that the elected government was not meeting their needs. 1
Ot would be such a blessing. But I am a brittle Diabetic.I have fought this disease for over 35 years. I have been told if I was the average diabetic I would.nt be here now. But I do all I can do to be the best diabetic I can be. 1
Out 1
Out of control of the follow through. 1
Outstanding 2
Over whelming 1
Overwhelmed 3
Overwhelmed and excited that I could help transform individuals I to successful adults 1
Overwhelmed with joy because of the fact they were comfortable talking to me about there concerns. 1
PRAYERS 1
PRETTY BAD 1
Peaceful and grateful 1
People has there own opinion and I stated mine . 1
People should NOT be drinking cow’s milk 1
People would be appreciative (hdopefully).I would be happy ,reservedly.Congratulatory wishing the new owners all the best 1
Perfact well done amigo 1
Perplexed 1
Pissed 1
Pissed off 1
Planned parenthood? 1
Please Help, and I would. 1
Please delete my account and any information I may have shared with you. Merry xmas, and all the best. 1
Please don’t send me there adopt me 1
Please don’t 1
Please find a good pantry locally to help give you some food. 1
Please give me a chance, I am a good worker and I learn fast give me a chance to learn 1
Please help me 1
Please help us! 1
Please help us. 1
Please help…I would take her to a shelter. Make sure she is provided for 1
Please leave me alone. 1
Please note that not everyone plans to have a child or a grandchild. If anything, I just don’t want the amazing creatures to go extinct. This planet is too precious to be destroyed by humans. 1
Please quit commenting to me 1
Please read my previous comments about this deceptive charity. 1
Please remove me from your contact list..donor contact me again Thank you jean woolman 1
Please remove me from your contacts. 1
Please stop 2
Please stop I am not participating. 1
Please take me off your mailing list. I have made all the donations for this year. I answered your quiz, so now please respect my request. 1
Please unsubscribe me from your organization I’m not interested thank you 1
Pleased 5
Pleased and proud 1
Pleased that God was using me as a tool for His good 1
Pleased that I had tried to make the world a better and safer place 1
Pleased to do it 1
Pleased to have made a difference in someone’s life. 1
Pleased to help 1
Pleased, relieved, happy 1
Positive 2
Possibly suicidal and adrift from my community 1
Powerful 1
Powerless 1
Powerless and very sad. 1
Praise God 1
Prefer not to answer 1
Prefer to remain anonymous to recipients, 1
Pretty amazing and humbling 1
Pretty awesome 1
Pretty bad. I would buy her some groceries. 1
Pretty crappy 1
Pretty dam bad . No internet for advice 1
Pretty darn happy 1
Pretty freaking good 1
Pretty good 8
Pretty good since I don’t have kids. 1
Pretty good, I guess 1
Pretty good. 1
Pretty good. But I imagine their effectiveness could be impaired to some degree by the living conditions of the neighborhood. 1
Pretty lousy, I suppose 1
Pretty low and rotten 1
Pretty pleased 1
Pretty sad 1
Pretty satisfied 2
Probably 1
Probably be thankful I would feel good 1
Probably guilty. I don’t volunteer for people to thank me. 1
Probably negotiate but accept if hard to 1
Probably that my back hurts. 1
Probably why is my grandpa chasing my child and he has a bad heart I don’t know 1
Productive 1
Proud 21
Proud and generous 1
Proud and grateful for helping 1
Proud and happy 1
Proud and happy. 1
Proud and helpful 1
Proud and humbled to have made a difference in someones life 1
Proud and useful 1
Proud happy 1
Proud of myself for being a part of the larger picture to help heal our planet. 1
Proud of them and excited to help 1
Proud that I played a part in such a major benefit to humanity. But there are so many problems affecting humans and animals and I want to help them all! 1
Proud. 1
Proud. Important. Needed. 1
Purposeful 1
Put a smile on my face 1
Quit 1
Quiz is complete. The guilt trip is unnecessary. I voluntarily interacted with Charity Navigator. You don’t have to guilt me into giving to charity. This is overkill, and insulting. I’m done now. 1
Rainforests are kind of abstract for me. I live in a desert. How would I tell my grandchild that I didn’t do anything to conserve the place I live? Especially since there is a non-zero chance that my local ecology will collapse and I’ll be a climate refugee? 1
Rather guilty 1
Rather helpless. 1
Re do 1
Reading is fundamental to future development and success 1
Ready to help 1
Real Terrible 1
Real bad 1
Really Don’t Know. 1
Really SAD 1
Really bad 1
Really don’t know??? 1
Really good 4
Really good and proud that I could help! 1
Really good because I could answer them 1
Really good! 1
Really good. But unlikely 1
Really happy 1
Really happy cause I know how it is important to have a pet for comfort and love and they are awsome therapy 1
Really up set 1
Redo 1
Regretful 1
Regretful.. 1
Regretful; determined to learn about current near extinct animals 1
Releived 1
Relief 2
Relieved 10
Relieved and grateful 1
Relieved and hopeful 1
Relieved and sad. Hoping the dog understands. 1
Relieved for this family and feeling grateful I can help 1
Relieved they are safe. 1
Relieved. 2
Relived 1
Relived to give warmth shelter, and safety to a family. Satisfaction. 1
Reminds me of Peter Singer’s famous essay on poverty 1
Remorseful 2
Remove 1
Remove end 1
Rescue her dog 1
Response 1
Responsibility 1
Responsible 2
Responsible. 1
Restart quiz 1
Rewarded 1
Rewarded, humble, proud 1
Rhanks 1
Rotary International is my chosen 4 Star Charity 1
Rotten 2
SAD 3
SAD. 1
SO GREATFUL 1
STOP 32
STOP PLEASE 1
STOP contacting me 1
STOP or I’ll BLOCK YOU! 1
STOP 🛑 1
STOP!! I’m leaving 1
Sad 153
Sad & Angry 1
Sad I would offer them a place to stay 1
Sad an won’t to feed them 1
Sad and a bit angry 1
Sad and angry 3
Sad and angry and frustrated 1
Sad and concerned 2
Sad and concerned that her pet be cared for 1
Sad and determined to prove the coach wrong. 1
Sad and embarrassed. 1
Sad and fairlyhelpless 1
Sad and guilty 3
Sad and hurt 1
Sad and like a horrible human 1
Sad and scared 1
Sad and sickened 1
Sad and sorry course I would like to help the girl 1
Sad and useless 1
Sad and wondering how to help 1
Sad angry frustrated 1
Sad angry worried a 1
Sad because it’s temporary 1
Sad because she can’t provide food for kids. Or herself 1
Sad but hopefully we be ok God take care of use 1
Sad but incompetent 1
Sad but they need a library cards 1
Sad don’t want to leave my dog with anyone 1
Sad for her and her child 1
Sad for them and empty my pantry to feed them 1
Sad for those people my heart goes out for those people 1
Sad guilty 1
Sad it’s not in the United States 1
Sad that I can’t help 1
Sad that they don’t know the joy of reading 1
Sad to tell them the truth 1
Sad very sad where god wen we need them 1
Sad 😭 1
Sad! 1
Sad, 1
Sad, I would want to help 1
Sad, and looking for a way to help both her and her dog.Also feeling a need to reassure her that all will be well, and have solutions for her concerns. 1
Sad, angry 1
Sad, angry and sick to my stomach!!! 1
Sad, angry, and wanting to help and to encourage her to be as safe as possible, but not to give up! 1
Sad, guilty 1
Sad, horrible, and sad 1
Sad, upset with self 1
Sad, with a strong desire to help 1
Sad, wonder why she’s on the curb, am I capable to help her 1
Sad,angry 1
Sad. 2
Sad. That I. Had. Not found a charity. Earlier I 1
Sad. Wrong. 1
Sad. Frustrated. 1
Sad. I want real housing for the homeless, not temporary shelters. 1
Saddened and determined to find a fitting response 1
Saf 1
Said 1
Sat down and cried 1
Satisfaction 1
Satisfied 8
Satisfied I actually helped someone 1
Satisfied and useful 1
Satisfying 1
See if I could get him in a new school that will help him 1
See that’s the thing,. I would help. But if I was them I would say,. Get lost. Get away Frome here. Go home 1
Selfish 3
Selfish and Uncaring about another human being 1
Selfish and entitled 1
Send 1
Send me the question again 1
Shame on you. Greta 1
Shame. But I don’t choose that as an ideal motivator. 1
Shamed 1
Shderot 1
She will say Thank you and it was delicious and grateful. I would feel very grateful that I was able to help the family. 1
She asks me to make sure to take Lucy into my care and give her all the love and affection that she has gave to her and make her apart of my family as she did. 1
She is an environmentalist at heart, I am proud to say, but has little resources like me. 1
She might say I hope my clinical trials on me wiil help others live maybe help them have a better life than me. Sad that there’s nothing to be done for But her volunteering for clinical trials she’s proud that she can help others after her 1
She might say she can sleep again at night knowing that she will never be oppressed or under threat again because now she is safe from Muslim fundamentalists and living in Israel. 1
She might say, “Thank you.” I would say that I was just being a good neighbor. I wanted her and her child to feel safer, sleep better, get some respect and resources, and have breakfast. I would want her to know there was hope, and I cared. If she was a Christian, I would pray with her. Otherwise, I would wish her well, and pray later for her, on my own. I would feel grateful and happy that I could help. 1
She should apply for Ebt card&problem sloved 1
She won’t get help!!!!! They don’t support local shelters 1
She would feel confident and secure in knowing that her dog would be cared for. I would feel humbled and grateful to be able to help. 1
She would say thank you so much. I would feel great that I could help her. 1
She would say the Lord truly blessed you 1
Shit 1
Shitty 3
Should make them feel excited that they’re needs are being met , great job which can provide the help they need and more opportunities 1
Sick 1
Sick in my stomach 1
Since I was once homeless myself, I know how hopeless you feel in this situation. I can make suggestions on where she can go and who she contact to receive transional housing to have time to breathe and be safe, until she can gain employment which would lead to permanent housing for herself and her child. 1
Since this is the story of my own child, I’ll share his thoughts. ““Now I can be somebody!”” To hear those words are heartwarming and tear jerking. To help a child who believed that without college they were nothing and change those thoughts into positive ones andmaking a dream come true is beyond words. 1
Sisters 1
Skip 1
Smart and intelligent 1
So awesome and great wat a beautiful world we live in why wat is going on 1
So blessed to have been a blessing. 1
So feel bad 1
So glad you found a new home. Would you like help finding support in your new neighborhood? 1
So good 1
So good for the folks that could find out about it and understand that they could help themselves and their families. After working with the USO as a volunteer for over 30 years and helping our military and their families I know that feeling!? 1
So good inside. And so very proud of myself. And thankful that I am able to give. 1
So great. Od be on tears 1
So happy 1
So happy I would cry 1
So happy I’d cry 1
So happy!! 1
So helpful 1
So impressed, very imotional enough to remember it!! I was a teacher for 30 years 1
So make me feel good that they feel she feels good that she’s got food to cook for her family 1
So regretful and selfish 1
So sad 2
So sorry 1
So there fellow may I ask you bin there so have you any advice or thought for my direction 1
So what 1
So what do you have in mind talk to me honey 1
So what,help him 1
So you want me to donate to a specific charity that you directed me to. No.  1
Some of us did our best, some people were just too stupid to combat 1
Someone should help the old woman find a placement for Lucy so that plan is in place so the old woman will know well ahead of time that Lucy will be taken care of. 1
Something more local to me 1
Somewhat good 1
Somewhere to sleep 1
Son 1
Son I am old and have next to nothing but I will take the adviceof those who will lead me to help you ant way I can. 1
Sorrowful 2
Sorrowful, Imagining what if that was me I would like to know that this perfect strangers approach would be an opportunity to work find housing and means to meet my monthly obligations that this not an reoccurring effect of my life as a single parent myself raising 5 children on my on basically, if wasn’t for a nursing Assistant Nurse, job adequate transportation a strong church home and supportive family but most of all and the key ingredient knowing Christ Jesus as my personal savior. 1
Sorry 1
Sorry I can’t do more. 1
Sorry I didn’t tell him or help to find more information. 1
Sorry I prefer do other charity 1
Sorry already have donated 10,000 books 1
Sorry but I would ask if I could help I wouldn’t reject people always need to hand in life 1
Sorry but my texting skills are inadequate to make my best response 1
Sorry for the lady because she needs to survive I’d try to help her where her needs are most important to her 1
Sorry got to see go now 1
Sorry hit the wrong Button all Good 1
Sorry, I’m disappointed with the quiz, and I’m done 1
Sorry, I’m not willing to get into emotions 1
Sorry, currently homeless myself right now. Since May. The salvation army work help her, or social services 1
Sorry, this is set up awkwardly and I choose to not continue. 1
Sorry, your program is too limited. 1
Sound good 1
Sound gra t 1
Sounds good 1
Sounds good to me 1
Sounds good, but more interested in other geographic areas 1
Sounds interesting and real. 1
Sounds like a good choice 1
Sounds like a scam 1
Sounds like he might have hope instead of depression. Sounds good 1
Sounds like something I’ve done before. 1
Sounds like you are guilt tripping me 1
Sounds tragic 1
Special 1
Special to be able to help this boy out 1
Ssd 1
Standing up for the weak and handy caped and children have always been a priority on my list 1
Start over 2
Start the hunt!!!!! 1
Stip 1
Stop 117
Stop for the second time. 1
Stop please 1
Stop sending me messages 1
Stop sending messages 1
Stop these messages. I don’t want to participate anymore 1
Stop 🛑 1
Stop. I am quite comfortable with the charities I support to help refugees, displaced, and hungry. Stop. 1
Stop. I don’t want to continue with this. STOP. 1
Strong 1
Strong, empowered 1
Such greatly fulfilled 1
Super 1
Super bummed. 1
Super good 1
Supercalifragilisticexpialidocious 1
Supported 1
THANK YOU 1
THAT IS A REAL WORKER NOT ONE FOR SETTING AROUND A REAL GO WORKER ONE THAT IS FULL OF WORK AND NOT JUST ACTING LIKE A NOW IT ALL WILLING TO TRY DIFF THINGS AND NOT COMPLAIN DO THE JOB AS ASKED IF NEED HELP AND DONT COMPLAINNE 1
THEY WOULD THINK I WAS COLD HEARTED! I WOULD FEEL LIKE I LET THEM DOWN ! 1
THIS COULD NOT BE ME I WOULD HAVE TO BRING THEM HOME WITH ME. I WOULD HELP HER I LOVE BABY 1
THIS DARN SURE would not be ME. I WAS A YOUNG MOTHER ONCE. I REMEMBER THE STRUGGLE. I WOULD ALSO FEED THE ANIMALS 1
THIS WOULD MAKE ME FEEL HAPPY AND USEFUL AND BLESSED THAT I CAN HELP FEED SO MANY CHILDREN AND WIDOWS . 1
Take her to a shelter 1
Take her to get help feed and shter her 1 night 1
Teamates and coaches need to accept all players. 1
Tearme apart 1
Teem not team. Maybe the education one would be better. 1
Teen, not team. Fix that and let’s go on. 1
Teerible 1
Tell me how to help 1
Temperate rainforests? 1
Terrble 1
Terribile 1
Terrible 49
Terrible and embarassed. 1
Terrible and give thrm a room to live in till i could get them settled 1
Terrible and guilty 1
Terrible and hurt with being sad 1
Terrible and make me very thankful for what I do have 1
Terrible because I get him help. 1
Terrible 😢 1
Terrible! 2
Terrible, like someone needs to do something. I would go into action with raising money 1
Terrible. 1
Terrible. But I have another concern. I don’t want begging letters throughout the year. One is enough. I don’t want “gifts” to thank me. I want my donation to support the cause. 1
Terrible. That’s why I already support Feeding America! 1
Terrible—it is a fear I have. 1
Terribly 1
Terrific 1
Text me please 5182601714 1
ThNk you for your support in extending my life. 1
Thank mei would feel happy 1
Thank them for their service and direct them to helpful organizations in the community as I and ““elderly and couldn’t help them financially. Possibly make them a meal at times. 1
Thank u grandmom 1
Thank u, so much….Good… 1
Thank you 13
Thank you I am finished 1
Thank you Lord for all you do both night and day. You help the sick and shut in the physicallyand mentally challenged each and everyone and for those who disagrees and feels you don’t do enough forgivethe Lord they don’t understand that while it seems your neglecting.people you’ve are actually preparing them for the. Blessings you have prepared for them 1
Thank you Sir or Ma. For all you have done and given. I offer my Prayers for our Lord God bless to be now for you. Thank you so much morethan said 1
Thank you and God Bless you 1
Thank you and good 1
Thank you and good inside to help that person. I would thank God for making everything possible that’s my answer thanks 1
Thank you for making sure I’m safe when she passes. 1
Thank you for saving my baby’s sight. I would feel thankful. 1
Thank you for the charity navigator 1
Thank you for this excellent survey I’ll be donating to Fedding America Immediately 1
Thank you for your service. How can we help youright now? 1
Thank you grandma 1
Thank you so much 1
Thank you so much .I would feel that my efforts were welcomed and necessary . 1
Thank you so much your God sent 1
Thank you so much, you not only helped me but my family too. 1
Thank you would be enough but not even necessary 1
Thank you! 2
Thank you, Granmom ! 1
Thank you, Granny 1
Thank you, I am a special teaacher. 1
Thank you, I would rather deal with a faith based charity than secular - think Salvation Army vs Red Cross. I think this should be one of your criteria and more local - can’t change the world, but can change my community. 1
Thank you, I’m done, very interesting experiment. Bye. 1
Thank you, I’m going to begin donating to this charity. 1
Thank you, over whelmed 1
Thank you. 3
Thank you. And I would feel grateful that I could help. 1
Thank you. I do give monthly to SPLC 1
Thank you. I would be relieved 1
Thank yoy for helping. We appreciate it. 1
Thankfu 1
Thankful 7
Thankful I was able to help improve her life 1
Thankful and crying 1
Thankful for being able to bless 1
Thankful that I could help 2
Thankful that I was able to help make the world less scary for her and her child 1
Thankful that I was able to help someone to continue or better their life style. 1
Thankfully, I give to Samaritan’s Purse, which helps farming families like his. 1
Thankful… 1
Thanking God for giving me the opportunity. 1
Thanking for helping me, it would make me smile 1
Thanks 7
Thanks for making me feel safe 1
Thanks for pushing me in the right direection to fend for myself in the future. 1
Thanks for the info! I’m finished. 1
Thanks for the tip! I was just trying to find a beneficiary since I probably won’t be alive too much longer. I’ll look into this Housing Matters group, never heard of them before. 1
Thanks for writing the book reading it with me. 1
Thanks! This is enough 1
Thanks, I got the recommendation 1
Thanks, not interested in the question. 1
Thanks. 1
Thanks. Great. 1
Thanks. Finished. 1
Thanks. That’s all 1
Thankyou 1
That I have an impact 1
That I have caring bright grandchildren who understand how vital their contributions are and how difficult it is to insure their children and grandchildren grow up and experience the rain forests and all the creatures in them! 1
That I help another person achieve their goals and that I am proud of the outcome of the work that was done 1
That I helped accomplishe something for the future generations 1
That I made a difference and positive impact in someone’s life. 1
That I needed to do more 1
That I was helpful. 1
That I would be very sad and I will offer them a place in my home until I got them a place for them to call home 1
That I’d made a real difference 1
That depends on the sincerity of the person 1
That feels a little manipulative which turns me off 1
That is a fine option for a charity. However, I don’t need to a local animal care charity. That is completely volunteer run and all funds go to the animals directly. So there are no ceos to pay or employees to pay. 1
That is exactly why I support Samaritan’s Purse - they meet those needs and also provide hope thru the gospel of Jesus Christ. 1
That is good but I prefer a local shelter - Thanks! 1
That is missed the boat. I want them to experience music and the arts 1
That is not true 1
That is so devastating. I would feel horrible & want to help more. 1
That is wonderful, but you should support locsl 1
That it’s an opportunity to connect them with help 1
That last set of questions caused me to be suspicious of this entire ““study”“. No more. 1
That makes me feel great 1
That sound good thank you 1
That sounds awesome 1
That sounds good. I keep dollar bills folded in the visor of my car and for years have passed them out to people who are asking for help. Now 2 of my friends are doing this, too. I feel it is important to give without judgement. This might help me do more. 1
That sounds like a worthy cause 1
That sounds pretty amazing 1
That sounds really good 1
That sounds very cool 1
That there are people who don’t judge 1
That they are grateful and at peace and I too would feel grateful and at peace! 1
That they reached out and asked me if I knew of any resources in the area? 1
That they were blessed bye God.. 1
That they would feel grateful and thankful for what they have 1
That this shelter is placed here by loving, caring people who want to help her & the child be protected from the harms of the outside world and a roof over their heads 1
That what I contributed made a difference in someone’s life 1
That would be amazing 1
That would be an amazing feeling. 1
That would be awesome 1
That would be awesome but right now I have no money because I got my Heart 💗 broken and scammed trying to get a puppy 1
That would be awesome! 1
That would be great 1
That would be great, but sm more interested in prevention. 1
That would be me 1
That would be so sad. 1
That would be totally awesome :) 1
That would be wonderful 1
That would be wonderful if there was a lot of this taking place. 1
That would be wonderful to be able to help someone like that!! 1
That would break my heart 1
That would feel very good, but might make me cry. 1
That would hurt me to my heart if I ever have to tell someone that 1
That would make me feel as I made a difference in one’s life in a small part in time 1
That would make me feel bad 2
That would make me feel blessed 1
That would make me feel downright awful 1
That would make me feel fantastic Knowing that Lucky has a new home and is being well taken care of 1
That would make me feel great! But give me a local organization 1
That would make me feel great. 1
That would make me feel like I matter 1
That would make me feel really good 1
That would make me feel so so grateful and very happy 1
That would make me feel so wonderful. 1
That would make me feel very sad cause I’ve be their myself 1
That would make me very sad . 1
That would make my heart so happy 1
That would really make me happy 1
That would sound very good! 1
That would touch my heart, make my day… 1
That would.wrong for some one not to give the child food 1
That wound be nice 1
That’s a hard one I do not know on that one I’m caring caring person my heart’s my damn phone so it’s hard to ask on that one 1
That’s great 1
That’s not the right question. I’ve done a lot of work in this space and your question runs down a different path making my answer irrelevant. 1
That’s not why I donate. 1
That’s awesome! 1
That’s manipulation and below you, Charity Navigator. 1
Thay can’t do ti 1
The rainforest is teeming* with life because of work other people have been doing; I just gave them a little bit of money to help get it done. But the work is deeply necessary, so I’m proud to have been a small part. And look how beautiful it all is! We must continue to play a part. 1
The app did not give me a charity name..or who I might imagine I am talking to. 1
The bot doesn’t work 1
The child and parents are being tossed aside. 1
The children would love it and so will the parents and me knowing that I have helped someone 1
The choices given didn’t include the direction I would pick or I didn’t understand. I would always help the veterans first. 1
The lady would be content in knowing Lucy would go on and hopefully be happy to do eo 1
The lions den has been there all along man intruded into his den. 1
The look of thanks in a Mother’s eyes as her child improves is all the The thanks I need or want.. Gratitude is the Attitude.. 1
The most important message I can give is about continuing to protect and repair the environment. 1
The mother may ask if I could direct her to a shelter or church. I would do my best to help her with advice or meager money if it could help. 1
The mother might say, ““It’s for my baby!”” And I would feel self-loathing. 1
The new road needs to be moved 1
The old generation is so irresponsible 1
The point isn’t to move the animals, who will probably just return to the place they know. Besides, more animals than lions are endangered by this toad. I would tell them to build an animals only over- or underpass to allow the lions and other animals to cross the road without being endangered by the cars. They are very successful in the states, including Fla and the west. 1
The question doesn’t make sense. 1
The rainforest needs time to grow, and if people cut down all the trees and pollute the water, it will be bad for all life there, plants, animals, even humans. 1
The reason I am interested in The Dana Farber Cancer Institute I am an 26 year Cancer Survivor. I can relate to Women or Men that are being diagnosed with Cancer. 1
The same 1

The well-being of wild animals is important to me, but a higher priority is nonhuman animals who are being actively and systematically imprisoned, tortured and killed by humans.

You did not make the correct match, Charity Navigator AI.
1
The young lady would thank me and I would be so proud and also happy 1
Ther are two possible answers. 1 could provide bussung for the area children or 2 provide for closer schooli0ng. 1
There are no special Olympics chapters in my region 1
There are plenty of opportunities. Some you will have to create. 1
There aren’t enough parameters given for my liking 1
There is a team you can join… 1
There is always a place for everyone. Everyone has a community they can be a part of. 1
There is no chapter of this charity in my area. 1
There is no listed charity. 1
There is no location near me which I believe would be an necessary question to make a charity match decision. 1
There is no way I would respond without helping! 1
There’s no arrow 1
There’s no need to guilt me into giving to charity. I was the one who sought you out. I will give to them if I choose, probably by going to their website and not through a middleman 1
They are missing so much in left, not being able to read 1
They are old enough to know 1
They are probably hurt aņd angry already, the person might get angry at me, and it would make me feel lower than dirt 1
They be great full 1
They did not say anything to me. 1
They do great work. I used to be on their mailing list. 1
They do not understand how dire the present situation is 1
They feel desperate and helpless 1
They have 3 days before they are put to death due to overcrowding 1
They may ask about this period of time and wonder why we didn’t listen to scientists. I would feel frustrated 1
They may ask for money. Very sad I just hope I could find them room 1
They may say I am worthless help to them 1
They may say how could people allow this to happen, my response would be it’s big business that the greed within us why it happened. The oil and pharmacidal company’s are just a couple at fault. 1
They may say thank you and what prompted you to pick this charity 1
They might ask for help and if I didn’t help I would feel awful. 1
They might ask me to take care of her. I would then be able to say yes or no or ask around to find a safe forever home among my friends. 1
They might ask why I wouldn’t help. I would feel guilty and powerless 1
They might say ““I want to go to college when I grow up but I don’t know how I can.”” It would make me feel sad in some ways but also make me happy that he/she has a goal and a challenge. It will also make me understand ( as I grew up poor) as I worked most of my working life with low income children. I believe in children and believe all children can learn but I also know that schools and teachers are not what they used to be. 1
They might say ““thank you.”” On the other hand, they could just say ““feed me.”” Either way, it would make me happy. 1
They might say I didn’t really care. That would make me feel terrible. 1
They might say fuck you and I would feel bad 1
They might say iam wicked and me too by their response i may loose my peace 1
They might say they have a baby or young children who are hungry. 1
They might say they were grateful for the opportunity they had, and I would feel glad that I had helped to make it possible. 1
They might say to please help. If I didn’t I would feel guilty 1
They might tell me their story about how this impacts them. It makes me feel useful 1
They needs to do something about this 1
They probably would say either good job or something like you could have done better 1
They said thank you…felt like I’d made a difference 1
They say Thanks for showing me the way. I say I say you’re welcome. 1
They were excited to have their own books! 1
They will need my help at the moment and because am not able to help them coz of my situation I will feel very bad about it 1
They will say that they don’t have anything to save and this will really make me feel bad 1
They would be amazed, and I would feel grateful to be able to help. 1
They would be angry at the world 1
They would be gracious in speech and thankful. I would feel worthy of another day on earth 1
They would be grateful for someone showing up when they needed help. I would feel empowered because I helped someone get through a difficult experience 1
They would be horrified, they would hate me. 1
They would be so happy to have a place to stay and they would be able to put the next problem into play without feeling of being unable to! They would feel confident within themself. 1
They would be very grateful and I would be happy that they were safe 1
They would beg me to help them.
I would feel an immediate need to help them and would feel bad that I didn’t
1
They would cry and it would make me feel so good to help 1
They would do what the kids need 1
They would feel a lot better knowing someone else cares to help 1
They would feel safe 1
They would probably appreciate it a lot and Thank me, I would feel wonderful that I could help doing God’s work. A Blessing 1
They would probably ask for assistance. I would recommend agencies, resources available to assist them. 1
They would say I don’t care! I would want to die! But that isn’t me 1
They would say thank you 1
They would say thank you very much and I would say God bless you 1
They would say that we (old ones) are the ones that caused the problem. But they are the ones that have to live with the results of the greedy, glutinous behaviors. They would promise to leave the earth in better shape when. For there grandkids. 1
They would say to me: Do you know what you’re doing? I would feel amused. My response would be, this doesn’t aline with my field of expertise. Let me find someone who can help you. 1
They would say we need more money for classroom expenditures 1
They would say “Thank you” Whether they said thank you or not I would feel feel really relieved that the air was clean! 1
They would say, ““thank you,”” and I would be so glad. 1
They would thank be in a most grateful manner. 1
They would think i was crazy and i would abd i would not blame them 1
They’d probably cuss me. Everyone else does.🤨 1
They’d probably see me as heartless, privileged, entitled, selfish, and stingy. That shouldn’t make anyone feel good, to be called those things. 1
They’d say ““wow, thank you.,”” I’d say ““you’re welcome.’ 1
They’d say I am ready and able to be productive andcsupport my family 1
They’d say, help us please. And I’d want to. 1

They: We cannot continue to live here.

Me: I feel the same. I live here too, and we are all in the same boat.
1
They? I thought you said A young woman 1
They’re going to tell me that nothing works and I need to look deeper to help them and that’s going to make me sad but it helps to to looking for more solution to help 1
This area wouldn’t allow that to happen 1

This assumes I would do nothing after talking to the child, and this is trying to motivate through guilt. I don’t do that kind of guilt and I am highly motivated by facts and logic — not manipulation through feelings.

If I knew this were the child’s situation, I would do what I could, but I know that a 1:1 response is not logical or sustainable. I would work to connect the child and family with an organization that would provide long-term support, then support that organization.
1
This great. I have a few blood disorders that would benefit from this. 1
This hard sell was unnecessary 1
This is a stupid bot. Takes forecast and no real answers 1
This is a waste of time. Bye. 1
This is a waste of time. I answered the questions, it says nothing about what charity it is…..forget it. 1
This is a weird, manipulative question. 1
This is actually a standard scenario in many countries. 1
This is confusing - are you asking what they might say? How I might feel? 1
This is magical, as I have been a monthly supporter of the ASPCA for decades! 1
This is my yard, not yours. 1
This is not for me 1
This is not the right charity for me. I am more interested in disability justice and representation. 1
This is not what I want 1
This is not working. What charity? Talking with whom? 1
This is so me. For years I have dreamed of opening a shelter. Not just a regular shelter but 1 that would provide job help, would help a person get on their feet. One where the person could work and have child care on the premises and they wouldn’t just have a cot to sleep on, but their own living quarters. I would also have a separate area for those just looking for a place to sleep. Plus more 1
This is such a injustice and I have been there and I feel the pain becausethose shoes are hard to fill. 1
This isn’t the Humane Society, right? I hear the HS has a big pile of money that investors take from. 1
This organization is too mainstream for me. 1
This person matters and their need is important so they can continue to pay it forward for a better world. 1

This question feels … manipulative, and obvious.

I’d feel bad for her.
1
This question is designed to elicit an emotional response I am not interested in continuing this conversation 1
This scenario is extremely unlikely 1
This shouldn’t be happening 1
This sounds exciting 1
This sounds like the perfect charity for me. I love that they mention Scarborough’s Rope. I will look into this further. 1
This sounds perfect for me. Thank you 1
This the world I want for them 1
This too shall pass 1
This would make me feel great. 1
This would make feel incredible! 1
This would make me feel good . 1
This would make me feel amazing knowing that they are learning something that will be prosperous and they are putting the effort in. 1
This would make me feel badly. But that said, the five options to support education were too narrow and Girls Inc is not my charity soulmate 1
This would make me feel content. 1
This would make me feel helpful and needed. 1
This would make me feel okay 1
This would make me feel really good 1
This would make me feel sad. I would never not give her food for her child and herself too. 1
This would make me feel very good, knowing I helped provide for a mom and her kids. 1
This would make me feel very sad 1
This would make me feel wonderful 1
This would make me happy 1
This would make me happy that I was able to help someone 1
This would make me proud of my client I helped and also proud that I was able to do so. Thank you for the time we trained together and my best regards for you and your future 1
This would make me sad but for the old person it would give them great comfort to nknow there pet is taken care of 1
This would make me sad for both of them 1
This would make me sad to know that she thinks the dog is going to bad hands after she is gone 1
This would make me very happy. 1
This would wonderfuĺ, I would encourtage this person to stay with his learning and strive to go further in his training. 1
This wouldn’t put a big hole in my heart, bcuz it could b me and children of starvation 1
This. Is. Not. Mine oroscopo 1
Tho I will feel bad because I can’t help him 1
Those are the kids who get all the breaks 1
Thought this was a non-emotional study. Are you purposely mixing variables? Is the next question how much I’ll contribute? 1
Thoughtful 1
Thus is useless and tedious 1
Tired 1
Tldr 1
To always have a roof over there heads and heat 1
To be honest I would be very proud of myself and the 1st time I was afraid on how I was rated 1
To make a better safer place to live 1
To not be cruel to animals 1
To retrain that person for another job with benefits and pay them more money 1
To the best of my ability 1
To whom? 1
Too bad the US was your only option 1
Too many either/or questions! 1
Touched and grateful 1
Tracheotomy 1
Trans lifeline 1
Try again next year 1
Try to find an agency better to take care. Of them. Take her there & make sure it was OK & in her best interest 1
Tuck them in bed with her and she sleep in bed with them on top of cover don’t sleep hard and wake up doing the night 1
U are wicked It will make me feel bad 1
U mean being like a mentor. I might be interested in even like u said just talking to a student I can relate to that because I grew up in a very poor family of 8 I have five siblings we had lots of love but little money and I was able to go the school of my dreams for my masters degree which was Columbia University in NY 1
USA 1
Ugh 1
Ummm, not me. I know the community food banks and programs 1
Uncaring 2
Uncomfortable. I’m not looking for praise. 1
Uncomfy; it shouldn’t be about me. I often prefer being behind the scenes. 1
Unfortunately, that is not a good example for me. I Am 84 and not techie. But if I were more competent I I would be honored to Make such a contribution. 1
Unhappy 1
Uninformed and powerless 1
Unsubscribe 1
Unsubscribe please 1
Unsubscribe! 1
Unsure they would be thankful. Same way someone receiving an organ transplant would feel 1
Unworthy, lesser than, a looser 1
Up set. No one deserves to be treated that way. 1
Uplifted 1
Uplifted. I donate to dozens of organizations, I don’t get that kind of feedback. 1
Upset 8
Upset and frustrated 1
Urdu. My. Masng Bangui 1
Useful 7
Useful and elated 1
Useful and happy 1
Useful, blessed 1
Useful, fulfilled. 1
Useless 5
V 1
VERY PROUD 1
Validated 2
Valued 1
Valued, making a difference, 1
Very Badly 1
Very Happy 2
Very Heartbroken 1
Very Sad 1
Very Sad, and wishing I’d done something to make a positive impact 1
Very Upset 1
Very angry and very sad 1
Very bad 11
Very bad ,cause I have a 15 month old baby girl and I what want everyone pull together for kids that’s our future 1
Very bad I would do my best to preserve the land for the lions 1
Very bad. 1
Very concerned 1
Very concerned and would like to send them to the tight organization that can help them get a foothold to start a new. 1
Very depressed 1
Very excited about me telling them about my adventures and proud 1
Very glad 1
Very good 26
Very good about my place in this world 1
Very good because I like helping people 1
Very good inside knowing I helped someone 1
Very good knowing I had done something to help others 1
Very good!!! 1
Very good. 2
Very good. I already give to Feeding Tampa Bay which is a subset of Feeding America. 1
Very grand 1
Very grateful 1
Very happy 8
Very happy a confident 1
Very happy for him 1
Very happy to know they were in a warm place and out of the cold. 1
Very happy 😁 1
Very happy! 1
Very happy. My main concern is that the world is a cleaner and safer place for my child and others. 1
Very helpful to help others in need 1
Very helpful to others. 1
Very humble 1
Very hurt and compassionate for Lucy. I would want to take her in, if only temporarily. 1
Very hurt that I couldn’t help him financially 1
Very important 1
Very low and like I have to do something 1
Very much 1
Very nice 1
Very out raged 1
Very pleased but I wouldn’t be on the river. I worry about animals here in the US 1
Very proud 3
Very proud show my grandchildren how pay forward. 1
Very sad 17
Very sad and helpless 1
Very sad and un professional 1
Very sad,cause I worry about my own pets. I would try to find Lucy a living family and home. 1
Very sad. 2
Very sad. That is not me 1
Very sad. I’d take them home w me 1
Very sad.. I’d take her pet when she passed 1
Very sad….but to supply the book(s) is only a PART of what I would do. Children need a solid program (like phonics) and a solid educator to be successful. Also the parents need to be involved much more. 1
Very sad…but want to help more than elephants. 1
Very satisfied 1
Very satisfied. 1
Very smart 🤓 1
Very special and important 1
Very terrible no one should go through this it’s a terrible feeling and it is terrible to let the family down as a support man should do for their family 1
Very thankful 1
Very unhappy 1
Very upset 1
Very upset and saddened. 1
Very warm inside 1
Very well satisfied. 1
Very 😢 1
Very, very GOOD. 1
Very, very happy! 1
Very, very sad 1
Very,very,crappy. 1
Very. Sad 1
Very. Very. Conserva. About it 1
Victorious 1
WONDERFUL 1
WOULD YOU LIKE TO ADOPT 1
WOW 1
Wait, why would I have done nothing to help Lucy? 1
Want to be present with them. What can I do to help you? I will also be praying for you and your family. I want. To do more than pray. 1
Want to go to my house 1
Want to take care of this person 1
Wanting to fight for them 1
Warm 3
Warm and cozy 1
Warm and fuzzy 2
Warm and fuzzy; ecstatic, excited, joy in my heart! 1
Warm and useful 1
Warm hearted 1
Warm inside. 1
Was able to help, someone that needs a new start 1
Was looking for something that has at the root of mission glorifying God by reaching out to others 1
Wat response 1
We I love helping people I wish I could go back to work 1
We are so lucky and so proud being your grandchildren And you will be a great example for this generation 😀. I will definitely feel so fresh and peaceful 😊 1
We are suffering here.
It would make me feel awful.
1
We can only hope 1
We can work for change 1
We didn’t realize how bad it was going to be 1
We have a food pantry here in town that can help you. I know the person that can get you an emergency box right now. 1
We have cancer in our family. Leukemia 1
We need to fix this 1
We need to support the public school system more 1
We need your help 1
We need zohelptheo crananimals 1
We took charge of what need to be done that would work for other people and get are brother hope and love so he wants a place in this world 1
We want to be here for you. You are safe here 1
We would help with all her needs. 1
We’re done, thanks! I know everything I need to know! 1
We’ve given to Chef Jose previously. Can’t think of the name of his charity. 1
Weall, I wouldn’t walk away, theres the salvation army and local places. we live in small town 1
Weepy and happy, but also sad I couldn’t do more. 1
Weird, since I don’t have children and don’t plan to, so no grandchildren either . . . 1
Well 1
Well … there is no possibility that I’ll ever have grandchildren, so that’s not really a relevant concern. I am a SCUBA diver though, so I’ve already seen the decline in our coal reefs. 1
Well I am 67+1/2 years old now, and how I’ve rescued many innocent animal’s through out my life here on this earth,yet if I were in Africa and a lion got hit by a car, how it depend on the Lions injury’s,if it can be saved then how I’d do everything within my power to find another place for it to survive,heal from it’s wounds,it of needed to see a Vet.doctor first.And if the Lion was run over by a car in the hunting area maybe it be best to leave well enough alone, how I do know that I’d not want to get eaten up by other Lions, and neither would the animal rescuer in Africa.Its a tough decision call to make.Plus the innocent animal’s that I’ve rescued through the years I’ve been living on this earth none of them were the size of a Lion. 1
Well I don’t have kids but I imagine if I did nothing I m a heartless bastard anyway 1
Well I have never thought about this. But I do agree they match my goals. Have to think and study up on this. Thanks. 1
Well I hope someone would help him 1
Well I love animals 1
Well I tell her that a child is a gift from God and get everything she needs and seek justice for her unborn child 1
Well I would feel awesome to be there to help a child with it’s mother that’s what my ❤️ would do and it’s the right thing 1
Well I would help much as I can to show how much I really care from my heart 1
Well I would think with the modern world we have way to much technology which is a good thing and bad 1
Well I’m really not sure but I don’t think I’d really be so proud of it 1
Well considering the fact that I’m a single mother of 4 young children struggling to make ends meet, I would do anything in my power to help that mother and let her know she’s not alone and people really do care 1
Well fill good because girl will rich school earlier so that to start learning 1
Well first of all my heart would hurt just because Lucy is going to miss her best friend. I would be worried that she might give up too. However we have to move on. But it would be my honor to make sure she finds her new forever home that would feel like they’re the luck ones to have lucy. I would want Lucy to know that she is like royalty. She’s been through enough and should be known how lucky her new family is to have her. 1
Well good but I don’t know what I can do cause I am disable and at this time I need food also 1
Well if I felt respondance able, I would not say anything.I don’t though I help all I can. Now what good is that,if a balance between everything including people.I need help 1
Well its my experience that children are taken from a parent with no.home so That’s bullshit they would get first .pick in any shelter situation 1
Well of course I would love that but I also want to stop animal cruelty with domestic animals of course and that is my first choice 1
Well poeple would help each other to get settled in . 1
Well since don’t say who I’m talking to I think you need to fix your program 1
Well wait a minute I want to help you don’t have to guilt me into it. 1
Well, Apparenlty HIAS doesn’t help people to cross the border. I looked. They help people already in refugee camps. So I wouldn’t suggest they contact HIAS. Plus–I checked–does HIAS also support Palestinian refugees–e.g. those stuck in the occupied territories of Israel? I don’t see that on their website, if so…. 1
Well, I already support multiple environmental charities and my grandkids know it so ok in that score! 1
Well, I don’t just want people to have a shelter for the night. I want them to have permanent housing. 1
Well, if at the time I had the money, I wouldn’t do nothing. I would obviously do whatever I could in my power to help. 1
Well, something that we in the first world countries I guess you could call him or take for granted our lifesavers to the third and fourth world countries and I can understand them being invigorated and happy and Jo Anne ready to learn and oh that would make me very happy becauseI like nothing else to see somebody be happy and content with their present situation, then somebody that struggling and fighting the world if you know what I mean 1
We’ll be sad to see you go. Let’s try one more time (that’s the last of it, we promise): 1
What 2
What ?? 1
What I would say, I would just feel horrible 1
What I’d really like to do … two different things. ** I’d like to photograph dogs and cats who are looking for new homes, helping them to put their best paw forward. ** the other thing I’d love to do is help puppies and kittens get used to be around people. And if they’re really young, to help bottle feed them until they’re pld enough to eat puppy/kitten food If I could do any of these, I’d feel I had purpose in my life. 1
What about St. Jude?? 1
What about sexual assault victims 1
What am I imagining You left something out 1
What am I supposed to say? 1
What are you interested in and perhaps we can help with education to get you employed in a better paying job to provide for yourself and family. 1
What can I do to help them now and figure the rest out as the day goes on 1
What can I do to help? 1
What can I say? 1
What can’t I help this teacher out with a few boxes of markers? 1
What do you need to feel safe in your home? 1
What is an AED 1
What is he hiding from me ??? 1
What is the answer??? 1
What is the charity 1
What is the exact name of the Charity? Is it affiliated with the Urban Institute? 1
What is the source of the pollution in Ohiol 1
What makes you think women will be given credit now when they’ve had it taken from them at every time in the past 1
What question? 1
What respons 1
What the dog & cats would say? Or a person 1
What the f…… 1
What they might say 1
What they say depends on them. Their trauma may encourage them to be silent for a while as they continue their journey. I strive to meet people where they are and have no expectation of how others respond to their particular situation. 1
What type of books would they like to read 1
What was the question 1
What was the wuestion 1
What you mean. They would prolly just scream and say ewww. I don’t know I don’t have grandchildren I’m only twenty one 1
What’s the question 1
What? 1
When I get my dream I can give them nice places and edto live specially with the children and give them education hot food. 1
When you have so many privileges, what would it really cost you to help someone who is truly in need? 1
Where do you live 1
Where is this charity? We began a similar charity in Taunton Ma. 1
Which I never had kids 1
Which arrow 1
Which charity? 1
Who I do not have a lucy 1
Who are you talking about 1
Who is ““they”“? 1
Who, I did not get a charity name 1
Who? 3
Why can’t you help me? 1
Why did you let this happen and you did nothing to prevent it 1
Why did you not stop it? 1
Why didn’t anybody tried to save the planet and animals to be here for the younger generation 1
Why didn’t people stop this? 1
Why didn’t you help me and defend me? I would feel really bad and helpless 1
Why do my feelings matter in protecting their life and sustainable development? 1
Why do we have ““ill-equipped”” teachers? 1
Why don’t you come to my house and discuss this 1
Why not help us? 1
Why not, Nonnie 1
Why wasn’t homelessness mentioned? 1
Why won’t you help us you can see we need help with this please help us 1
Why would I ever imagine this? I do not appreciate this clumsy, ham-fisted attempt at emotional manipulation. Do not bother contacting me again. 1
Why would I smile politely and do nothing? I would have them contact the civil liberties union or the local Barr association 1
Will I live? 1
Will sorry I don’t like here I was put out to I 1
Willing to help more as a volunteer mentor 1
Wish someone would do that for me! 1
Wondeful 1
Wonder ful 1
Wonderful 32
Wonderful I want to help end animal cruelty and save all the animals 1
Wonderful glad to have helped 1
Wonderful! 2
Wonderful, and I’ve done this. 1
Wonderful. I would feel I have achieved my goal of paying it forward. 1
Wondfu l 1
Woohoo! We did it, 1
Worm and knowing that I have been there someone when no one else would to see that they won’t be on the streets 1
Worried 1
Worried what about tomarrow 1
Worried, upset and want to help any way I can. 1
Worthwhile 1
Worthy 2
Would be achieving my goals 1
Would be good to help that man 1
Would do what I could to help her out 1
Would everyone do the same. Sleep safe 1
Would feel bad 1
Would feel great 2
Would feel sad 1
Would feel sad for her and would ask her if there was anything I could do to help her enjoy today’s. 1
Would feel this is a useful beginning for this person 1
Would make me feel I helped someone have a better life 1
Would make me feel bad because I wold like to help 1
Would make me feel good for helping someone because I kno the feeling it’s not nice 1
Would make me feel good, but I don’t have offspring (on purpose) so no grandchildren for me! 😂 1
Would make me feel great! 1
Would make me feel like I respected the woman and let Lucy be happy with a new family 1
Would make me happy to be able to help 1
Would need deep analysis 1
Would not make me feel better. Though I can’t fix the problems that caused them to flee. I can help, one person at a time 1
Would want to help 1
Wouldn’t like that 1
Wow 5
Wow! It takes a village & we can do hard things if we work together! 1
Wow! My ancestor stood up when needed! 1
Wrong 1
Xxx 1
YOUR QUIZ DIDN’T WORK 1
Ya 1
Ya I’m not donating any money ,I have taken in so many animals and payed for it myself. Also I have 4 homeless Children living with me right now, anyone want to donate to me for the children ?? 1
Yeah I’d be honored to impress my grandchildren and help the world at the same time 1
Yes 8
Yes I have stage 2 breast cancer 1
Yes Thanks 🙏❤️ 1
Yes that would make me feel good. 1
Yes we 1
Yes! 3
Yes. I. Would. Never. Let. Them. Alone. Give. Them. A. Place. To. Stay. I. Know. How. It. Feels 1
Yiu are not reading my texts. 1
You are manipulating me. You just lost your credibility and ethics. 1
You are no help! I would feel useles.s 1
You are so welcome. I’m so happy for you that you will get a good educational opportunity. 1
You are useless 1
You are way to optimistic about the solutions to this problem 1
You are welcome.Lets find something long term. 1
You can’t try to make me feel guilty 1
You chose the wrong charity 1
You did the work. Glad I could help. 1
You don’t have to sell me on reading. I was a literacy volunteer many years ago. I worked with adults where English was their second language. I also had 20 nieces and nephew’s that I read to quite often. 1
You haven’t given me the name of a charity yet. 1
You need to put your money where your mouth is. And where you’re pretending your heart is or you’re not really sincere. 1
You tell me 1
You tell me how i fit leftout 1
You were doing great right up until now. I’m looking for facts, not emotional manipulation. I’ll look into the charity but I’m done with this chat. 1
You will make me feel very bad we couldn’t help him 1
You would have to take a good look at this picture . You need God’s help 1
You’re more than welcome. I am glad I can help you. 1
Your Chatbot does not work. This makes no sense. Logging out. 1
Your love of reading and learning warms the cockles of my heart! 1
Your post is asinine, to think that preserving the rain forest is more important than preserving the 600 million acres of public land in the USA outside of Alaska, it not a reasoned or knowledgable position. 1
Your questions are going beyond the scope of the test and I’m done answering 1
Your survey is way to limited and doesn’t work for me. 1
Your welcome! 1
Z 1
a lot would depend on what the child said. if they requested a book i’d go get them one. 1
a trust fund for pets 1
accomplished 1
again 1
already support St.Jude’s 1
although i can’t personally appeal a sentence, i would want to help in any way i can 1
amazing 1
angry 2
angry and empathetic 1
angry. perhaps a bit guilty 1
as long as I have a case 1
ashamed 4
ashamed, but helpless 1
ashamed, embarrassed, guilty complicit with government 1
awed 1
awesome 2
awesome! 1
awful 5
bad 10
badly 1
been the done that in gatlinburg tenn 1
blessed 1
boooooo 1
1
bye 2
cAN YOU HELP ME? 1
can we start over? 1
choose charity purpose 1
compassionate 1
complete bullshit, all cows milk requires forced breeding and taking away the calves, what the fuck 1
concerned 2
condemned 1
confused 1
content 1
couldn’t do it 1
crappy 1
delete my account 1
depreseed 1
did you know there are 10 states with no expanded medicaid for adolts with no minor children? 1
disgusted and frustrating 1
do you have any other recommendations for m? 1
don’t understand 1
done 2
done all this in my working life 1
done. 1
effective 1
emotionally fulfilled 1
empowered 1
encourged 1
end 2
end conversatoin 1
end response 1
enough questions 1
evil 1
excellent 1
excited to have helped and proud of their acomplishments 1
extremely good 1
extremely gratified 1
extremely happy 1
extremely thankful to the universe for letting me help someone 1
fantastic 1
feel not well 1
fine 2
first question i was asked, ““are you looking for international or US”“? I answered international. You gave something completely unlike I was asking for. 1
for a chat bot you aren’t very interactive. 1
frustrated 2
fuck off 1
give her help getting to school 1
give me a link 1
glad I could do something to help 1
glad I could help 1
gladly let her know that we are pleased to bring box of food for her & her family she would probably 1
go away 1
good 51
good I guess 1
good about myself 1
good, but still worried about the next night for her and her child 1
good. but I feel strongly about other issues as well 1
good? 1
goodbye 1
goof 1
gotta go 1
grateful 6
gratified 3
gratified to help 1
great 19
great! 4
great’ 1
guilty 3
guity 1
happier than a turd in a punch bowl 1
happy 17
happy I could help 1
happy and heartbroken at the same time🥲 1
happy that I have been able to help 1
happy they aren’t hungry 1
having another heart suy 1

he might say thanks for your help. I appreciate it.

I would feel like I did what I thought was necessary & feel good about helping that person prosper in his future
1
heartbroken 2
help help 1
helpful 2
helpless 5
helpless and discouraged 1
honored 1
hopeful 1
horrible 7
how can I help 1
how do I exit this thing? 1
how would I even know him 1
https://cdn.fbsbx.com/v/t59.2708-21/271391393_285833123577164_3019058740671391760_n.gif?_nc_cat=1&ccb=1-7&_nc_sid=cf94fc&_nc_ohc=-5JEOP_QD9wAX-D1Hbn&_nc_ht=cdn.fbsbx.com&oh=03_AdSpXJbYBzmgDO3hEolOCSt5paJSfA7uDRl7hF8IC_B3Iw&oe=658143FF 1
https://cdn.fbsbx.com/v/t59.2708-21/355796881_1276586876618477_8031109614283727481_n.gif?_nc_cat=103&ccb=1-7&_nc_sid=cf94fc&_nc_ohc=7FZxylfzx7cAX-8Lf1y&_nc_ht=cdn.fbsbx.com&oh=03_AdQ0c-mlkeoMeO4_8ADJQt3JU7QW9cf00kLFVZzPgMzPZQ&oe=65707120 1
https://cdn.fbsbx.com/v/t59.2708-21/364208135_261183633338001_6854460817308457234_n.gif?_nc_cat=1&ccb=1-7&_nc_sid=cf94fc&_nc_ohc=W-yf_jt7kFoAX-gBLCU&_nc_ht=cdn.fbsbx.com&oh=03_AdSAE0CxSfXEXXKpkxj0RfnqpTBEu_GCxS25N7PVtzg-0g&oe=657397A6 1
https://cdn.fbsbx.com/v/t59.3654-21/408099449_7041222199254705_1094935351253789165_n.mp4/audioclip-1701668125000-169018.mp4?_nc_cat=100&ccb=1-7&_nc_sid=d61c36&_nc_ohc=1ClPjsX4HZkAX-8fqGC&_nc_ht=cdn.fbsbx.com&oh=03_AdST2oApC3nERJ0419f-jh7gmZzd4XNGBHst49mbnsbbCA&oe=656F1CA1 1
https://cdn.fbsbx.com/v/t59.3654-21/408171501_894064962305232_278759541567395800_n.mp4/audioclip-1702120529000-2438.mp4?_nc_cat=107&ccb=1-7&_nc_sid=d61c36&_nc_ohc=eMyVJSgaGS8AX8Zp-ja&_nc_ht=cdn.fbsbx.com&oh=03_AdQ-iGF4F0bLl7IoAt_Y_-muUqFdOC1kj2ZzsyaXNQdIuw&oe=6575AF8F 1
https://cdn.fbsbx.com/v/t59.3654-21/408253731_1021064522511039_1768092292428029293_n.mp4/audioclip-1701898277000-257824.mp4?_nc_cat=107&ccb=1-7&_nc_sid=d61c36&_nc_ohc=YnBx-5AVM1IAX9W-f-n&_nc_ht=cdn.fbsbx.com&oh=03_AdRfSXwFwCLdPJ6Q3_fbj0MB08iks7pYP4zasuYjmFgS-A&oe=6572DE23 1
https://cdn.fbsbx.com/v/t59.3654-21/409594335_339587722148100_3227941336017767688_n.mp4/audioclip-1702601380000-11076.mp4?_nc_cat=111&ccb=1-7&_nc_sid=d61c36&_nc_ohc=aC1I0_Htjh4AX-mq_R3&_nc_ht=cdn.fbsbx.com&oh=03_AdSgt1XKhUki3ehl8VBQesI6Kn0MxKLfkVQ69svCjOPBmQ&oe=657D7742 1
https://cdn.fbsbx.com/v/t59.3654-21/410381031_336816302423428_5504261149107230163_n.mp4/audioclip-1702525225000-7059.mp4?_nc_cat=107&ccb=1-7&_nc_sid=d61c36&_nc_ohc=QVfLRV9No7wAX83FJsQ&_nc_ht=cdn.fbsbx.com&oh=03_AdRtvNvZE3m73CkzBO0u3_J-Y9hFh9luaJ4xfbPqdIeKhA&oe=657BE5BE 1
https://cdn.fbsbx.com/v/t59.3654-21/410804794_1522895131584831_8646873821215929121_n.mp4/audioclip-1702664997000-9172.mp4?_nc_cat=100&ccb=1-7&_nc_sid=d61c36&_nc_ohc=SEzbp3bFV-UAX8FnuJV&_nc_ht=cdn.fbsbx.com&oh=03_AdSNypQDuhphei4NwV0zWTrDUFxPczcpQe1zQAx_KHqVeg&oe=657E51A9 1
https://cdn.fbsbx.com/v/t59.3654-21/410857435_249967967901912_4607731210678087945_n.mp4/audioclip-1702686881000-60256.mp4?_nc_cat=105&ccb=1-7&_nc_sid=d61c36&_nc_ohc=a7qS8bIkwx0AX-qw0ka&_nc_ht=cdn.fbsbx.com&oh=03_AdQmz8OejjRGui0SuvOX513HG1EN7kVyiFIlnXyd04bXyA&oe=657E614A 1
https://cdn.fbsbx.com/v/t59.3654-21/410901688_394614582981671_6358871435143137147_n.mp4/audioclip-1702705985000-195373.mp4?_nc_cat=110&ccb=1-7&_nc_sid=d61c36&_nc_ohc=D2tgNRm0BZcAX-tPFxV&_nc_ht=cdn.fbsbx.com&oh=03_AdQhfZhdhyVyusTDlv4hmiIAYZm5HXPXf3_0XGjxO-gpbg&oe=657F2823 1
https://cdn.fbsbx.com/v/t59.3654-21/411853185_1324926681492653_9030273789224396072_n.mp4/audioclip-1702868172000-20502.mp4?_nc_cat=107&ccb=1-7&_nc_sid=d61c36&_nc_ohc=ngwjdiRyVIIAX-xJ0q4&_nc_ht=cdn.fbsbx.com&oh=03_AdTmV_s9aLLdKxsz3ykNpAap__CiFPJ_BF4mG9vqUow2GA&oe=65818341 1
https://cdn.fbsbx.com/v/t59.3654-21/411867483_915559153421652_7432739312506052260_n.mp4/audioclip-1703308368000-146837.mp4?_nc_cat=105&ccb=1-7&_nc_sid=d61c36&_nc_ohc=7bvC1FJ4Dz8AX9FJNqX&_nc_ht=cdn.fbsbx.com&oh=03_AdRp5MjFocpf5-JX4uhFcf_mzK3nw_cMqQGAYXElPgRv1w&oe=65884E5E 1
https://cdn.fbsbx.com/v/t59.3654-21/412654645_324090900521375_1192623961824125495_n.mp4/audioclip-1703390988000-3971.mp4?_nc_cat=107&ccb=1-7&_nc_sid=d61c36&_nc_ohc=DzCI9MbRyfkAX9gfBEp&_nc_ht=cdn.fbsbx.com&oh=03_AdQt5rkZ5-0Zx3HK3kqqWrHXcLyycHKFxGcPZ1HzjUqHWg&oe=6589901D 1
https://cdn.fbsbx.com/v/t59.3654-21/413098555_1341728500559160_6377395458486547316_n.mp4/audioclip-1703381460000-307943.mp4?_nc_cat=107&ccb=1-7&_nc_sid=d61c36&_nc_ohc=OFM8Qa41SpcAX_rfbB9&_nc_ht=cdn.fbsbx.com&oh=03_AdRmZ-4fgcnwjbOZQxvdeasVBBoYbdIhAjHGGrHwc9h6OA&oe=65895BEE 1
https://cdn.fbsbx.com/v/t59.3654-21/413634773_7080641835361888_6438494061724087099_n.mp4/audioclip-1703264708000-6502.mp4?_nc_cat=111&ccb=1-7&_nc_sid=d61c36&_nc_ohc=_dg27M09LvsAX-uT-bH&_nc_oc=AQlFCm72UDP_GMcjMZOm7VtdGKzUTDubnVoQHlR_4xu8JvOOCHNrHQd6CpnAwLEwaEktvxQ3MvH-6npcpkXqyT2a&_nc_ht=cdn.fbsbx.com&oh=03_AdRJInde0SDZFs3J4MKCC8oS--b7LzNTMkcY-UsxH-XRwg&oe=6587ADDF 1
https://cdn.fbsbx.com/v/t59.3654-21/413902939_327605870167052_3973075981097173863_n.mp4/audioclip-1703463735000-2392.mp4?_nc_cat=101&ccb=1-7&_nc_sid=d61c36&_nc_ohc=Y_IytStn3cgAX-tFdxM&_nc_ht=cdn.fbsbx.com&oh=03_AdSuIOy3Xbu32bcsLdg1-iUCFs4H4L1VNUaDcS5vXleIBQ&oe=658A5F96 1
https://cdn.fbsbx.com/v/t59.3654-21/414440587_907902197456674_3563561036109738112_n.mp4/audioclip-1703913021000-22522.mp4?_nc_cat=109&ccb=1-7&_nc_sid=d61c36&_nc_ohc=iBjvQXNL24cAX-GTELm&_nc_ht=cdn.fbsbx.com&oh=03_AdT-hqGgJRzTHTcZVczXq_H3R0GmMzkvW1hVy25XMXNCkA&oe=65914A67 1
https://l.facebook.com/l.php?u=https%3A%2F%2Ftemu.com%2Fs%2FKJjZ7xczdg5af56&h=AT0kdqeG88brRI7NjvuFHaKFdDCHjDFkz_KuzIIZ16n4-LwZsWslCXYxOxwavJyMdd15aDXreE2t4WSyzjOVBhBNBjjyCw_-eQJRBwRC42s4JDmOqCPYncS62qH7ahgclx_Kk527rU4&s=1 1
https://m.doqxv6.top/a0c6dl5YY0lKBF0GRgFTUQxiVTByEV0OdxgHCUgxAh8bPDE4bRo1RCY3SR4VLRZYDEs_PEcLZy0zUixBcwJDTD0FMANIH1dUFQ&p=mpdims&_mi1703787788936 1
https://scontent-ord5-1.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX83-brB&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-1.xx&oh=00_AfB2b2UHMy4BsFwGhfrvYdigfV092TYcU1ZWVsHcCFVnTg&oe=6579FA4B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_aszf5&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfD5llGvMNNgEdEhBk5F5yfUC3_fyuZ9ojoVaXUg5VoRZg&oe=657BF48B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_p5_DU&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfBhHfhZ1rfZgltU7MxePV8tnVNZPDxabd0snFJU-28nrQ&oe=657BF48B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_qiiA-&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfCYCozrLjKnn-SdSw6xagWOOaqkoxmQIhJIIJ1uv8bJbQ&oe=6579FA4B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX-cVkBu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfBGdepW7gvNaJI0DfSYGn8jZlMijy9vmmNuW-Pt8_qWiw&oe=6570170B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX-jZfbl&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfASBAugQ8iCiaJoPXrKteRY0pDd_Ls6NNrGsj4Z08_gpg&oe=6570170B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX8SD7ZO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfCQthzTIYlE7-ooGDJJPskGmKDAxh-TIyoK5Zz0sjFl7A&oe=6570170B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX9U3COE&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfDDKFCMlGtDIgFBiZP581CeZm4HcMZ4mwRVtYzNwmKK-A&oe=656A284B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX_kWWwj&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfA9bZJb-DMJGiFsfnKO0fzdxKeo8KRxMaWmJwbU313inA&oe=656C228B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX-X-Klb&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfCpDFHCDY1ruVbmKi22UtazqOhkYQ24A05SegmJoTQ4jw&oe=6578000B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX99xARx&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfDJXwZUzYEFss_pOiMGosbIqgrcPbPAdFov3CbxZw2FVg&oe=6578000B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX-RnjDX&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfDUp72VEHQKpJSUojiIVAjlDXVNikowMiRowdckKn4uXw&oe=657DEECB 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX-Yv2xX&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfAkrwI-clOwfaNbiHKoPBVndH0qid_TsYAEb_PzNW-Z7A&oe=657DEECB 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX8sV4ui&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfDVpJAWiv8zaxKORKplJPCqP9pcxBJ5ZN3fB4WznhxE5g&oe=657FE90B 1
https://scontent.xx.fbcdn.net/v/t1.15752-9/371514711_1020191715985169_4903525810189975850_n.jpg?_nc_cat=108&ccb=1-7&_nc_sid=b65b05&_nc_ohc=KaRNmXxoY60AX8wu_-4&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=03_AdSvllIkdOP5By1t-Sr9JKGTtiBRjSNSKLNI7uD8Z4Pm9w&oe=65AC8055 1
https://scontent.xx.fbcdn.net/v/t1.15752-9/400920111_368370812403953_2824955597406204803_n.jpg?_nc_cat=110&ccb=1-7&_nc_sid=b65b05&_nc_ohc=uzffeNG00A0AX-zm_ke&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=03_AdTijZH8kPARiZIhJJE-nWBOV6ExtR4sD9n65TOkrda1zw&oe=65B5241C 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/14129667_1775284816045556_1588821643_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=gZAO6AR2s30AX_TzY9a&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDKeAa46PWP1j04y-GGdBtMkUcA-wyi5bxrnyWVYxXf2A&oe=658521BB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/365213689_1626311647858763_8975721824572341173_n.webp?stp=dst-png_p100x100&_nc_cat=110&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=7nzeh8tbyLMAX8UUOOp&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCIcvTVYzTxzv4FjJZ3z9fErV4qKNDHgqZHM7azN1H7IA&oe=65862759 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/365437392_1369509380643228_2799362884993075531_n.webp?stp=dst-png_p100x100&_nc_cat=111&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=6OZCvTJZfWIAX8U1S9a&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDgab7GCbK5euwM3YTW7wsI7K9DUTY88FWK9kzw1cbPVw&oe=658C0943 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/375594611_266105642898861_5403976904196268316_n.webp?stp=dst-png_p100x100&_nc_cat=100&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=ogiEIQNxveEAX_O3U-S&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCI7zJB-hMkytjO1uOpllNFIe0TPaWSxa3rRd5NYNOdEw&oe=658448DC 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX-0MKRo&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfASOxZIELLaD7x-TClIgnuURlrI52fVyXitF4yAktLg1w&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX-VfC5c&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBe92fQ6HIJa0kvLae2zryojUzJPw4wmjmNeU5hmi4xKw&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX-ZBRyD&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA63xidys-NTQwCetZvY1Pp12rBCqdXpG5m7TJTTK9o_g&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX-cvmVY&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBXbmA4gtb0J5cSOL8Sjzq4_TC2bWE738UQjlSUVylRIA&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX-x-VgO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB4Sjydptyc68bLpGqHGKN_-c5biFXIujzTUElDqJ3_Qg&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX8RANjN&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDhz_oCjgW0eMvodP6NMEPxSJY1yfLND5KEhcElqxAGmg&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX8Xjl8y&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDNOllEa7MbM9EqLbcTjW6Xy7i06bu6eRtsXaveb5Vfiw&oe=657DEECB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX8icmLs&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBa6UCJRwF_R_sb40envceZNrmRZkUdzdtlrCW2UuJJzA&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX8mENn7&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDEIvcZjsYdZVYmD7Sc1A85oERH1cqaSoBpXftG6s51eQ&oe=6579FA4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX9QiEHu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDtss252jTTiyAfUiYfTSHYWMaDxTFERTVGA40AIme1_w&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX9RI2PO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDYJ6FildH8WaoO_dwvLm0Q7044otwM-plSOz5QISFkbQ&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX9gGiTk&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBiXnmd3QO54acLjTBU6-yRxEm8up9Excx1BlslndE7EA&oe=657DEECB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX9sD0h1&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAw6gA8e75vBMjZyOZoLkieOBFkXBDoyqSTFYqlhuGvHQ&oe=6579FA4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX9ss0_Z&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBoH9czkkaQOSE7rwqA5m3gEMrunqyPQuDzhD1DCUxZ-Q&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_8m1S3&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBddEcN9g-JECotDib7iAB82mhn7y5pugZiP1cwdUNi8A&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_CG672&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBXvgcynAZqvIVOUpR6zltHZnSNOrR89D5pHdVAu7hHrQ&oe=657DEECB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_wqxMR&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDIdGnnO4RU2Ye9zvGc58q6kp4Wsz_sp7uUdMIn6PtM3w&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-1Pi7N&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDt7oyo92GoclxJT47C2qNUPv_vtSEBJNstgxh5nxaDAA&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-DuGaI&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCROW8p-wzmMSAkW4_9K_rwAB9SMSs7AbztzxMcPLNh_g&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-HAcJ7&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAxXGO29vBGowV-bPNFa5GZh2Y4jrQiDZp7U0uRELf6KQ&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-OzDAg&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCtcIp2XwmDoxT1Jok4t1TqFKp1xjNeUJkgmnGVX3mcWg&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-fVspc&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDaT_QdMDC_IkVx1Noi5zxo1ZC2u6dXp5k4e7YUZCDWxw&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8CC1CY&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDeAUHlnsGMI70gaZkwo-58ZNO1DpS3f4_y61mlAK4f0Q&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8J0DdT&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCgRCTEK4pV520adecUdV99DwNMCP8w54Nzcy8KHVNVCg&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8O6s7s&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD1_78R0Dkp79kJjm8dtphBXA8ohP0c4PgAJor2kJmO1A&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8RPcA8&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCSNbu08FS0HM-9AeaBnlwvBLSL97h_Uk1QS9ah7DgjSw&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8_oXCM&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAqZJcvuSmykEUnt0DggHkWMF87zFc6ji68cJmInVwkiQ&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8e2BW5&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAzbcM0Jjx8uYUa8K-HR31e82B0ntxOM7Z-1nCEkmSabQ&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8xE-Df&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC1Qw2CEgMUJ7WUS-2grqC9POHxQ4KzwKPbmWnMo3Ov0Q&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX93WSnU&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAvoDROJFfXDdB1wAXqpIcFou3BZ32l-DyvkjEN3UZNrA&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX95oGcn&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA1-AOtt8Kzoi9XG5Aey7ipoxvpFsWtXxaBVVoAdX9FBA&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9ExEZG&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBPpIg5ATeJpJqsEvP_wUU7lU4UIUgR0CHu7MbvC--vNA&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9GIpC3&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB00G8LvJDD2XQ5pHiyAkxmqp0hCib5RKE5hB4kVyWNTg&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9j62Zu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCFoeDcqFkZNlrC_I1kYY6KjNU2fHqQQu6xLqiot2eQKw&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9jcRPc&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDsLFvjBQtW77Gl3ryplNhJEcKbgJdhYrScGQdk-X_ryg&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9upTog&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCo4r8nuRRhCUNutH28EKdRdzktEjIH5Za_ASLvuSjKUA&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9wSlgl&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCnVXEURVIh8zLY1m05mPtUr8YMu4gQtNilnUUNfhqjVA&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_2toHN&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAuLrbyEC33_KlKcfx9ZZ6zCiFAxcXXHPZjQ26jSWzGBA&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_I2GWC&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDiIrgpPeaoAkO5ND_yL4mQaXy5-p6pV2yXDfHwPHif6g&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_lqhiM&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD4jFOvYjQKk0LLPHgev6rpUOh5l1vgMydR6BzKBml5pw&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_vAwqd&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAp_5AZa7q0lGCr_OS-kfyeYl4OZdl78worDUPmwiPoug&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX-88MJI&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA3TiENt9VZT6Zeqa6MrgyQX7ra3s5R2DeIQycPSAaiXg&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX-HDb0P&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAZNIIfI23YspnIpPN_Qpxq0ClGEBLesoeZTwCD0W-P-A&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX-bXxBq&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB1QJ2T2ozvndKzuG72y1SaGMUTJPQ7T36FzN9kPs9SYg&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX88lHsi&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC08BDuNwZST69ySudljLom1u9xN6cg0WmutvqHGSielA&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX8vnXYv&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCOZqgfXu9YBTv42jK0dQ-fRDuKCjEvlMhwVgV7IIfP6w&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX8w51sA&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCq2tCV-pCeU6r1GKvRw0cY69CUwJlFSuSOY9WRBDmMcw&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9ETfSM&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCcBTivq2n3AXNmiKsIf3GUHtCjqFln8lyclKNa4CIdMg&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9I--2_&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDjZkHkAHdrsikliTzXXlNd33PRRanjdR1GsXJgFYUlKA&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9PrQ7J&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAD7uVGtf6CN7UBV_EmZuXqv4Btao47uwY65Z8qmfJBCA&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9goTDz&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBrV6aIiYQpVJ0Xojek-oiMcxrJ34f3ENrIs9dEPAeByA&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_CETS0&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCkegp6abSxehzjCJgudX1-DFXx_Gq7zz6syF90L7cqnw&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_L3XsK&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBciqYkCTlmP4Uvg3czRZn6262SBB-hubzKwNvaM2IW3A&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_MpOG_&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC2yNT1yGwEV96mirO5HeU_S5r_3jfSC3cwi7YIdMl0HQ&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_k4XqW&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAPB4ErSE-thGrWWQzP5TVtWjLvsonQqFdcYP3BUyRLXw&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_qDVz1&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB2h6BMybhJBQ-lHsPYDJvC9d1TyivgEBVOM6P1aFpOng&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_ybp0y&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAHBKnAlx3Q_xyZ01oIWwTT_aXU6U3ds1ZCCXI7aBcQJQ&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_zfKWA&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA-guOTehktrwM-1Kb_xdhpG8FJcmczj3VKwkbhO9uh0A&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX-Enl-Y&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAuRXhK-PoO55F_dAmKbtBfqT_d0RvXuCZ5tgFoKT6CVQ&oe=6589CC4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX8Ajb-4&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAPfY5QGPIOeiFl2bggGNwWsvi98VJS2rSxYFibNgZNxA&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX8JXqKw&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBvJfcKDP9J_ZSdi7kvGXASMBK1Fsq-zxiLx3DXITM8QQ&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX8lUEEa&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA2RC41iwW-fVIkZvfgo-mDOS-ZN4TEdyUxdAti8isoRQ&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX8vDGL8&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD4kn37bDnFtQkwOOqXvzlZhy6av8UJX63GOx9EDJSWzA&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX9DbMGN&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCxmdEMqJrTjnIMWwsH_j6i7L25TVFPU7zaoVmW4DSw7Q&oe=6585D7CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX9fzCtl&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBihGZxzcKgRxdW2Uskcdhr6Ok4uyB2RHfpIvmPgOrw7w&oe=6589CC4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX_pmWxg&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCyjZsrp5PibX84AdwJs2iq6fkoEeI1ff8bO5ZDlPitLQ&oe=6585D7CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-0uHKF&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCwR2DL_PWDCoj6KF7DD3n83sBJX0fziupNEoFVFgfJlg&oe=6589CC4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-ACysV&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAwTN7ic3OoDk7HtXGPwICI7-7LFCQQtBphb2v5WxBPTQ&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-M0mtV&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDu9uG-evrWMB_NMCebtafeWnvM2O7V0rncr7CXHaOMKA&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-SJ53i&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBygr1bb8FmX_iX49QsF8xlFeDIE7JF3YOVsXJrD4n5-A&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-YvV-e&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDkaFRtuRU_3RugvBaN27Eliptif92ZGiVAYIQsyf93wQ&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-fgxcM&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAdSetzGr7se_0M6mSFaluVWXLhpnEZsbOGzvuWZuktWw&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX89Cz1w&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBNb5qxS8wODVkr0ThIJ9HKCC9XKOMpR3HCakciMtHyOQ&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX8BKe63&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBVlaJJMMtFBLCFq2WSayeHc0Zj8z92BITLtLNHvceM3A&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX8UzZ2e&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD_IOV9exaHI2DaRkAQ2zu7_JQLcHXIbeWuAC_Uuf6E-Q&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX91fXDK&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAvBUGTQNvOXJ6zH_qTwA4OjpqDdJwD2wIWDw3OOMYGLQ&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX9s4pOl&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAhLFH4NMQtbvcYHbPD9hiZiTMyd-5koTkFWCixD2mDgA&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX_6s8OQ&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDCtF9pgeJeWzoQJ6EU3FULF224d4I6w94c0v-QEjkV4w&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX_BaIUb&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBh5Ghq7-H-xm3q06SAskfkLqDj7YJYWLkUI_DZ1oMbOA&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX_R81xh&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA9BCKzWR5SS834fnatNMa7TcK27yWRIAMYp7WAZ-wk2g&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX_Z28H3&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCQMl6Nvi3vFjt__APS-FnKNz3y5PxyJ_dZXyo9aIozbA&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX-oO0qU&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDh_GgUNIJp7wTv1TPJLg0fOCpEw7IjmKRuYiTe1aUoag&oe=6570170B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX84EYZA&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAxw0O-pDfM-oevQP2eM5xkda8KsZ1DxzhSwwRUkXNCBA&oe=6570170B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX8Xw1kM&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCewedYHqNaViIYNv-Z8AkzLkqT92IwjU_8ZfRmeR1bDw&oe=6570170B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX8csLYf&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAQ8ZbZd_4nZ8KgtAQRG8P8s2R08BGgCXXJUg3_ceytoA&oe=656E1CCB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX9FHJq_&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDA2hqvTHIlu9fZ6egdunW3sKhmYd005vfKl3R-lKHwfw&oe=656E1CCB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX9twngU&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDQy__Uuxg3eEPTUe2gvlXQ6_XoaaGU6dYCf-3lJWB7ig&oe=6570170B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX_6Naml&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDBF-JSFLLzK_F6vcmkd0foBtvHPxD5bxohrQuVqKw6xw&oe=6570170B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX_Gq7Rg&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCMgk6znk5Kf3h1rjzWv7RBCRIYbya5Evmn1ZjMMt2moA&oe=656E1CCB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-IZK7Y&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB51xHuLiSlnp8K5-zBxyWItd-ELa4ljgrlZP4q3qk42A&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-JwAZr&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB5y0ys8EPkKSRnh5dLbmMmRaZDTwyupW6sTGYjj7t9ug&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-RxTJ_&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDuUWIagCWtnQgU-JVdU6ArzkyvnkZn8_qkVEn-_PIe4g&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-e0U8U&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDOF3W3zuqNwqgx3oOGDXyTgmsnuN_Ve9QBcgWeYmAlGQ&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-kghtY&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAXRmqynej1jayTq-fuRNW93SNTwiFbEtVuOz0CHv_VzA&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-o390B&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfASi8t6cM9HjcieY1xm06eLvoPraJ7Mx7cmJOTu1M_aEQ&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-qO5AG&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCT0GwP6Xwe6wb6cRbRsgrVlkBEW1rKm2qf4Q00D1Yshw&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-tWpb0&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDgC-VUP9TGUrualkrxG65UX603xvIlJwSU9lEyrZgbgA&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8GVdL8&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAT2jMZFdTeZw92-JopxngfLR_bSFgiqT_7up7vgOJ_XA&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8HoqOV&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCQYkKm42yYlpsbucAaJdkmuuDIT-HcesSfssWi91RYhA&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8SIvbb&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBZrknU-EpoRPozkqSuaCd-aw0tVHRlM-BzIctzGKDdVg&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8SsGBm&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCigaBMNUhGexonZ5-ej7JjhEWGtj-yyqQebnuBaaa36g&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8TU14j&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAK4TYc2VZBLijhmIBMhxSiBwZTEm9MS4kQKBjHwo8GcA&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8UQ5nm&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDiSj_BiMEXJFVLUT6mQZkFYn1Sk_SQNpe3up1OyJRwow&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8Vmkgd&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAHlhtaMvDrOfpLDJhX56PLJ4AWhDpFobD72RD_S9iebQ&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8aPfto&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBNISB1WAU5ZVxFKVRDd4tKXPyrHsuRjNagpHlEBiXBlg&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8f4QNu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCOXyMwGSEpU-ye34cSRVUh2iQUt3FWpnC7_HiZbBp5sA&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8iehYU&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBggme_Mvj8ALR3Xl4zcvXoBpLqhk0csvd2ZOY2OwzoMA&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8mBQgf&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAvAlwlNeLzLF7fG4SXu6eYGgxti58fuMH0M8Y-slgihg&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8sxFqB&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCSlHdKBvj_uOmjridAmbFek-nUiJU3N6ERSlLtYlZDqQ&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX90QgTe&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCAisWOdhWPLd-vTJXw34eJYUVu2YScCo-cPDCqLIyjBA&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX93B_nB&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBezZh-CkEZ_nLmzERCrP57aW_ZWiOcd-6z_jBHeeaYYw&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9l37KV&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA6vpndZwDSK21KOb4Iwr8-_10TwwiTxgoR3Eler3kylQ&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9ruk8G&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDxzbdY0O5D7FcxNq0eivxwFQprIDse7Wv6IxtHRfJWqg&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9xzOmS&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC7Veaxnlr7Jv2xdR9sjneIpA7WjVOjARBIQ8AgG7OW-Q&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_KpoLA&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA3-fEqNUvZk157rHx6PUn1oIZycyVbkYWgpERgYwc0OQ&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_Npgcz&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDKNDpVBG2lwmWCb1x950YPx4ygSnxJG11xUJFxJQndlw&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_O1PKW&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAKtUxRXIz0uMWeyNg6hETzj2g6u-ToL8t0dpAcFjU5OQ&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_Y-Ge1&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCVtggBUYjYnq8avfYcl4KSO6o9zqx4UpKlpCM212HnIQ&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_foV2o&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCHDxfKapMZ-ghTVLUy7af_LRfsy_h_W07PT9ggBinoxg&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_fruqa&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC21Cy-dSWO3Q0GqQpGe268ta1k38jxKil7UOWOy1b5ZA&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_gzNj_&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB8c7jqJA-oW4LGgc8bz8DbFzK2ig9l060iStg0H3bD_w&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_lkW7X&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBD7f8XEnDem4yHBrSvZLrywcE0nSifx5xYtobCDXlN8Q&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_rLMvA&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAIly2l16jmCOIe7lRDcMQO8SyV00RrpZCCb3xrg0ux4w&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX-3YCI0&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCiImxLEFWsMYejCk2xwLV65V1dTO9etGwbf_XkaZfiiA&oe=6572114B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX-eaDhb&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDnO4qN272FXSWmH34iXkeJ2VHi3ye8R32xyse3Xwm_OA&oe=65740B8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX9FkicO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCZrlQ13XGPlKuPuzyTDv5VutY-dAdOj1lWNfehjwPviA&oe=6572114B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX9f4zU-&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCCmcRZbNrKLt-hxX3h8JqjPIz4r3s5pdQuEtKpVmHehg&oe=6572114B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX9wIwl9&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDtQSkumEH7Rb7wZL8_tMvRm9y9KMi3lgADafnRrAfLYw&oe=6572114B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX_3ELMK&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDFD7AWsSEcuQqqoy1yaBM4b88YRJ1Q_Jz8v-s-8y9qGg&oe=6572114B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX-C4eyk&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBXTaXu4I4-atxSAnHYVW_8F73b__OqW5hvL9-NOb6mbw&oe=6585D7CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX-INiMa&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDkpY96fGXMKc9Wd0NY9URXTryw7pc0dGPnu0ChmIIKzQ&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX-JAIyX&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBYdt6deu7UrnpOqBSfCilvqKLzqhB37hCYTGhWBMCLUQ&oe=6585D7CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX-VNzjS&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBB2G43H0c-U2h23xvCAnKRRHY1fq-1DD_z7oYminUuOQ&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX-dP5B5&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDfSMVN1PXWM8BQRtOmaqQwzI4Pz6KDh3E7DacVPAjjAA&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX80RCRa&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCoeHa2QYfBwLoEnq5_NWfbBaCW0YzlncRlIzc_EicZtw&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX8KElPb&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC7wv5KlYyO2tKKuMg3se9CCS-9ZOJJDIR8MwedGNgK3A&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX8WHIx1&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAeowOkdIJyorkW7PHnZQ-39s4J4hR6gwuKD6G3Pla69A&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX8flAz1&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAej1r7vLKl8gwm_emE4na89Si7DmZeip9hxRfLiC2jDA&oe=6581E34B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX90Oj2Z&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCxBceOdI_KYwg8HRCj-swNi0_6IxBblD6Qi0kET0eAzA&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX9KNnFE&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDYZq_ZyuHDAIF2_WBGcRcdd3bdDR4pG7ip5fZhPcZCKA&oe=6581E34B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX9PWBgr&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBXwQF45qS0B8Kra5MVXklvLTDV3BB9elaFW9OC2k3Xfg&oe=6585D7CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX9XAoGJ&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC64LyzAjTb6qH-auWPd34qntZ-b9YedokMukzqa7kTxg&oe=6581E34B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX9_Ge87&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCsQ5bNSJsbLTv8ZzHo37hyfQaMHWmrXxcqzANg5-dTVw&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX9mVPNu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDxX3DkcBQk609I-oUC-e11jlzZ9TMQxsgHyCa1p-3w-Q&oe=6581E34B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX_Ut4M3&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCFmUTZ7Sn7jCGbMvGEYeOhK8_u7B88jhXw9l96CDlS6A&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX-k6AxO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDYqif93WRi-Plmx_K9w6z5ne0pu_TD2YVtMBAlq8M5cg&oe=656A284B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX8w60VO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDZ-CRdq3l-rdxun0z7Y12B4h_cJz2QtHjBhKl1fYzs5w&oe=656C228B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX9gAZL8&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAqg_m9Kgk193wC76T6aMrJ-65s5LaFn7TLU045A1EdYQ&oe=656A284B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX_pMdMk&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBYoqS2MvNfezfTP3N3tTHkOU35regDTPmaMdYU1YhIFw&oe=656C228B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX_v0WhK&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA2T-AN-E2ThB4C8ExO5YyoLl5Pn33sQ3OFKEObvZSiwg&oe=656A284B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX-fXPrB&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAkDjHkOfxBMvUcPbmoxoxqAe-PaiJitAM5C-RO8eWZ7Q&oe=6578000B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX-zZ_qd&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDQ0gF3uor68qy_G_2xCsklLTgq1e1XQdoBvLKRphVvOA&oe=6578000B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX8fwxRO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDiJNeUColtbqv23lV-F6SbKlhgfLAkH-2xV4KIwVHyiQ&oe=657605CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX8oPAm3&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB3MOOiPss0ElRD10iH9Dc6_sHnUbJTv5Sd5si5wGbtPA&oe=657605CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX_Kd1uU&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCLUZI5dQVMx5vYcGN_hj7m1Mka5SKOVg3XBM-Oi-ZfJQ&oe=657605CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX_uMfJH&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDPchHXhkLqoTEeNqi6XL-H5_mFPsUPHNjKRzBawfyh1A&oe=657605CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX-A47Db&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC1kmu3-VTvYdwQyod8cGtQzQyrSAB_dq0mSulVfzH_Tg&oe=657FE90B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX8xYXOE&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD7XI4upF2MSfSTdAGLkl85TGuZZEtkQ87-MK3JV1nnqA&oe=657DEECB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX9VykSk&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAypNunGfPkR2pHEQnSgL2VKrakAqeCpYCXKG-AYePOQA&oe=657FE90B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX9jal40&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBVOq8VvbylhJrSt3KhYJsbv5LR8rDEuD8TSYgM4LyZ-Q&oe=657FE90B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX_Q-7VT&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDafIu1dW2DGOEahbD7LYzVRcCijjcQNvra0VFa6cErRw&oe=657FE90B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX_sh0vV&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCJ8LuHr3YY124upe1N1vxZiE0trl-vtEIK3K2AjwbMIw&oe=657FE90B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=101&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_J7efD&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCSDSnuPFkoM4doqkR_dMhwz3vxLS09BeMxI_HeILVWLw&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/393821011_908962743919044_228092346710583890_n.webp?stp=dst-png_p100x100&_nc_cat=109&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=dNE4fOboSREAX8_JXhm&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDn8ivPw3XdBCrYhbYIsKQbkWrkMyiRA7bfHUqGDHVLuA&oe=657AD768 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/398369152_1330556884242457_4756096331270496556_n.webp?stp=dst-png_p100x100&_nc_cat=110&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=a4uRuHm_5N0AX_OFmo8&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCzdnb3wY1PXdvQMMNt339NP0Gf052mj8k49xy7cYs6HA&oe=658AA9EC 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/409223428_880100687129032_7426432018502277293_n.webp?stp=dst-png_p100x100&_nc_cat=101&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=LFabz0W2y7UAX_JCiX5&_nc_oc=AQnvlWs--h8bSXLfIz7cvu-pDfCT68K6BXBaMoABTXqooN55zF8k94cfejiKCsXjK6sN-heFkY8_c_684Uxe1bRI&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCrjtkHoWDkrYWdXE2yQVlY9I3QuvXQyB5vgEiT85P3rA&oe=65906D68 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/412275334_255916190611542_6592606869661796996_n.webp?stp=dst-png_p100x100&_nc_cat=110&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=5htC-dqmSpAAX_rf8V6&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCGc1Oo1NT7z9s249Lt3zQ7yUP261i6gc5JMh_Y7WFjyQ&oe=658AF420 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/413985330_1810303966061523_5545819025172939798_n.webp?stp=dst-png_p100x100&_nc_cat=108&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=VYIzhVTc3pIAX8v3tkX&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfALHqq-ksZn_QUiQkcDRma49J-TeERvAlm7ERGK-7Nwmg&oe=65895077 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/851582_369239386556143_1497813874_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=YtFR_nR0sSwAX-cJqUm&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBsQK902D7Shvtg7tFZUn379Yky3Y85P7xgC7X1Y2VVWw&oe=6595B411 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=4BYwTPs5EB8AX8_qWZB&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAvbtVT44aCWYOySWNeNDf2vaAWAX_Lme3pv-iRnfBBjA&oe=659305C6 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=CB05twjV2fkAX-y7ekJ&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAtdkWY2-Qe-FNLVS44ExdAZSTVOsXuHmkBI3nUt-eJ1Q&oe=65813986 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=igKoWEFbQNwAX-puWYY&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDktY2Pu6Mi977ieqW37AAOCu25DQ0K8nUO5PjoUSV7xQ&oe=65910B86 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=vUKirSMiXxIAX_cTnPz&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCtFZOkJBeX2HLCv0eIYmI0CIQZoZiJcPw3PTgK7AnvsA&oe=65755C06 1
https://temu.com/s/q4XhXMMEbwylF3 1
https://www.facebook.com/GWSAPPALOOSAS/posts/pfbid06NBhrw8kVcdpMp6dDCF2x6FJ5ATSKjYJLrunodx9TUatn2rvBnVcdNMYFi7gnDcYl 1
humble 1
humbled 2
hurt 1
i WOULD BE BLESSED THAT I COULD BE A BLESSING TO HER AND HER CHILD. 1
i am homeless can you helpme please 1
i cannot imagine a scenario where i wouldn’t help at all. 1
i don’t like children can I go back and change my answers 1
i don’t know 1
i hate aspca - 1
i have a gun and know how to used it 1
i know such a person and give to DF 1
i lost my mother to just that type of disease two years ago 1
i love to see children reading and smiling as they get new books… 1
i make sure ,go out an get food 1
i want to retake the quiz 1
i will feel badf 1
i would be very up set and pray to GOD to help me 1
i would be very upset at the cruelty that was shown to that young boy 1
i would do what i could do ! 1
i would feel awful and helpless 1
i would feel embarrassed and sad knowing that i’m allowing these things to happen to an animal with feelings. they can’t speak for themselves, and it’s not right to continue supporting companies and practices that continue this cycle of abuse. drinking milk, eating meat, and consuming animal products aren’t necessarily bad, but fighting for the companies who give their animals dignity and respect is important. 1
i would feel good and inportant 1
i would feel great about helping a young family 1
i would feel greatfful that god chose me to help them and all id ask from them is to pay it forward when their circumstances improve and are able to do so. 1
i would feel horrible and want to help 1
i would feel very good and accomplished 1
i would feel wonderful 1
i would have no words or not sure how i would feel 1
i would imagine what they might say to me 1
i would take them to one if several shelters around the area. i would feed them on the way. And pray with them and love on them 1
i would tell him that a disability shouldnt hold him back from achieving his goals and dreams and nobody has the right to treat him like that 1
i would want them to have the opportunity to visit snd see the amazing eonders of the sea 1
i’d feel that my life had had some meaning to someone other than myself 1
i’d rather help already grown adults 1
i’m finished, you gave me a charity that actually has spoken out against victims of major violence against women. I feel more alone than ever. As a counselor I would not be doing nothing, I’d be helping her get in touch with the proper authorities to assure her safety. 1
id try to help as much as possible 1
idk 1
if I could accomplish this goal, I would want to accomplish even more in helping to heal those in need of healing 1
if you can’t or won’t give me an address, then not for me 1
imagine, talking to a young woman who knows she is dying from a rare form of cancer and there is no treatment of all, and no clinical trials. A young woman who was married for a year and a half and pregnant, who lost the baby and was told there was nothing anyone could do. I’ve been there, thank you. I can’t even explain how I felt and still do. 1
impactful 1
incompetemt 1
indifferent 1
ineffective 1
it is getting late , I need to leave 1
it make me feel good because I will be helping other people 1 1
it would make me angry that his health insurance wouldn’t cover an injury he sustained on the job. but happy that i could help. 1
it would make me feel Real Bad 1
it would make me feel good, but honestly, animals are more my thing 1
it would make me feel horrible 1
it would make me feel horrified at the amount of food waste we have in the world and that a child is going hungry because of humanity’s greed. i would want to help this child, their family, but also to end this for childen everywhere. there is no need for anyone in the world to go to bed hungry with the abundance we have. 1
it would make me feel sad about failing our citizens, there should always be resources to help people improve 1
it would mean the world to me just to know that the baby was taken care of 1
it would slay 1
it’s only right 1
it’ll make me so sad. 1
iwould feel blessed to have the opportunity to help them with a solution to their needs 1
johnny depp or andy gibb is my dream 1
knowing that they have a safe and warm place to live in and have warm food to eat 1
leave me alone! 1
less word can help a student learn. then pick up a few more slowly then pick up speed in reading king thoughts 1
let us go to the food banks and get what all you need. 1
like I helped a lost soul 1
like I made a difference 1
like I made a lasting difference. 1
like I’m part of the solution 1
like a failure! 1
like a heel 1
like i’ve earned my place on the planet <3 1
like it did something worthwhile 1
like ive helped 1
lol 1
lousy 3
loving 1
m 1
mad 1
make me feel warm 1
maybe 1
mine would say why waste money on that? 1
mission accomplished 1
motivated 1
my church is involved with shelter; so i know all about it, thanks 1
n/a 2
needing to help 1
neglectful 1
neutral 1
no 2
no grandchildren 1
no grandchildren here 1
no response given 1
no thanks 2
not 1
not good 1
not great; how did we let it get that bad??? 1
not in US 1
not inclusive enough 1
not needed by me 1
not sure 2
not sure I understand the question. 1
not sure would want to do more for he and ckild offe [emenent housing with me 1
nothing they could say would shock or scare me and more importantly I would listen to what they need or are afraid of in the moment 1
nutral 1
ok 6
ok … I will tell you what’s wrong with this survey … I would pick several options … I do not give to charities where the CEO makes too big a salary. 1
ok is this over now 1
ok this is getting alittle over the top now 1
on the job injury 1
overly thankful 1
pained 1
perhaps thank you. I would be happy to see better health 1
pissed 1
please end chat 1
please go away… I do not wish any further contact 1
please stop 1
pleased 1
pleaswe remove me im not interested thank you 1
positive 1
pretty damn amazing 1
pretty godo 1
pretty good 2
pretty good, but I have broader interests, too. 1
pretty good. 1
proud 1
proud that i have made this happen 1
proud and gratified 1
quit 2
re take test 1
really bad 1
really fantastic did you read my excerp sir 1
relieved 3
relieved to have made a difference 1
relieved to know they are safe and sheltered 1
relieved to know they’d want to learn and fend for themselves in whatever ways they could 1
responsible 1
right, but the solution is not to clean up after, but prevent the corporations from making the mess in the first place 1
sad 32
sad or worrief 1
sad, disappointed 1
sad, embarrassed and angry. 1
sad, guilty 1
sad. 1
sadd 1
satisfied 3
see they know it’s not right but they do it any way!! 1
selfish and short-sighted 1
sense of well being 1
shameful 1
sick 1
since I have been in that situation. I would say, do it for the children 1
sounds like there are dummer people than me 1
start again 1
start new quiz 1
start over 1
stop 28
stop the questions, now 1
stop!!!!! 1
stop. 1
sublime and relieved 1
sure 1
take quiz again 2
talking to who? 1
tell hime that u need find good place and good money budget for own living with family and good wise budget 1
tell me more 1
terrible 10
terrible! 1
terrible; guilty 1
terribly guilty 1
thank you 2
thank you - great 1
thank you Stop chat 1
thankful 1
thankful and humbled 1
thankful for the opportunity 1
thanks 1
thanks for the recommendation, yes it does align with my values 1
thankyou 2
that would make me feel good knowing that they were safe and feed 1
that would never happen because there are so many resources locally to help sustain esp basic needs at first 1
that’s the goal 1
there smiles and big full bellys would say it all 😘😘 1
this is obviouly a scam 1
this wouldn’t happen with me, I cannot imagine it. Plus I do not know who they is. 1
too busy now 1
try to rehome her and if that doesn’t work out go to a no kill animal shelter 1
ugh. 1
unchristian 1
uncomfortable 1
unrealistic 1
unsubscribe 1
unsure 1
us 1
useful 1
very bad 1
very good 3
very happy 1
very happy and excited to continue the help 1
very happy that this person feels accepted 1
very sad 3
very sad and I know how that is because my sister daed in front of her kids with a heart actack 1
very sd 1
wanting to help that person to get the help she needed and find it. 1
wanting to improve the accessibility to clean water. Humans need water to survive. 1
wanting to provide lots of books and teaching her to read 1
warm 1
warm fuzzy 1
wateraid 1
well, I’m 70 years old and have no grandchildren 1
wfulfilled 1
what about a knitting charity 1
what about rare cancer 1
what arrow 1
what respinse 1
whatever 1
where is this most prevalent? 1
who is they? 1
wonderful! 1
worthwhile 1
would be sad. 1
would be very happy to be helping 1
would feel Awesome Lesa ButterworthI 1
would feel like I made a difference for someone 1
would feel satisfied 1
would make me feel inadequate and selfish 1
wow 1
yea 1
yeah thanks 1
mi número de teléfono es (475 )800_53 92 1
yes 2
you’re not listening 1
your stupid 1
Ì will get Back with you when I’m able to help with them 1
“You are most welcome” with a smile! 1
☹️🙁 1
❤️ 1
❤️ Broken 1
👍 2
👏 1
💔 1
💜 1
😀I’d feel bad. Would strive to share knowledge of BRAC (along with Heifer Intern’l; Peace Corp, etc) as resources. 1
😁 1
😊 3
😕 1
😞 2
😢 4
😢😭 1
😭 2
😭😭😭 1
😲 1
🙁 1
🙂 1
🛑 1
🥰 1
🥰🥰 1
🩷 1
NA 37843

Checking participants provided the reponses but missing treatment arm

  • We will check participants who have a recorded entry for the free text response but have missing treatment assignment. This is only applicable for participants who received either the opportunity intervention or obligation intervention.
data %>% filter(!is.na(treatment_text)) %>% count(arm_coded) %>% kable("html", col.names=(c("Treament Arm", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Treament Arm Count
obligation 4348
opportunity 4213
  • Currently, we did notice anything abnormal. All participants who provided a free text response have a recorded entry for the treatment assignment.

Checking manipulation order

  • In the chatbot, we implemented a randomized manipulation order (50-50) where particants were either asked to respond to this question, “How important do you think it is to sub_cause”? immediately after the treatment intervention if manipulation_order == 1 or after they were asked to sign up for the one-time notification if manipulation_order == 2 .
  • We will create a coded version, manipulation_order_coded and inspect instances where participants who have a recorded entry for the manipulation order variable had missing treatment assignment.
data$manipulation_order_coded <- data$manipulation_order

data %>% group_by(arm_coded) %>% count(manipulation_order_coded) %>% kable("html", col.names=(c("Treatment Group", "Manipulation Order", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Treatment Group Manipulation Order Count
1 1
2 1
NA 35678
control 1 1078
control 2 1085
obligation 1 1824
obligation 2 1243
obligation NA 1281
opportunity 1 1164
opportunity 2 1844
opportunity NA 1205
# creating variable that indicate missing treatment arm for participants who have a recorded entry for the manipulation order variable
abnormal_manipulation_arm <- data %>% filter(!is.na(manipulation_order_coded)) %>% select(analytic_id, arm_coded, manipulation_order_coded) %>% filter(arm_coded=="")
n_abnormal_manipulation_arm <- as.character(nrow(abnormal_manipulation_arm))
write.csv(abnormal_manipulation_arm, "./Data/Processed/abnormal_manipulation_arm.csv", row.names = FALSE)

before_drop_abnormal_arm <- as.character(nrow(data))

data <- data %>% filter(!(analytic_id %in% abnormal_manipulation_arm$analytic_id))

after_drop_abnormal_arm <- as.character(nrow(data))
  • We noticed 2 instances where participants who have a recorded entry for the manipulation order variable had missing treatment assignment. We will store these participants in abnormal_manipulation_arm.csv for further review and drop these participants from the dataset.
  • Before dropping the participants, we have 46404 participants in the dataset. After dropping the participants, we have 46402 participants in the dataset.
data %>% group_by(arm_coded) %>% count(manipulation_order_coded) %>% kable("html", col.names=(c("Treatment Group", "Manipulation Order", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Treatment Group Manipulation Order Count
NA 35678
control 1 1078
control 2 1085
obligation 1 1824
obligation 2 1243
obligation NA 1281
opportunity 1 1164
opportunity 2 1844
opportunity NA 1205
  • The raw variable manipulation_question_value indicates the responses from 1 to 5 for the manipulation question of “How important do you think it is to sub_cause”? We will create a coded version manipulation_value_coded to indicate the level of importance.

  • When inspecting the raw manipulation_question_value variable, we noticed other responses that are not within the range of 1 to 5.

data %>% count(manipulation_question_value) %>% kable("html", col.names=(c("Manipulation Question", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Manipulation Question Count
39854
0 1
1 115
2 27
3 203
4 971
5 5096
1
And now I have to block because there is no “stop” option. I would think Stanford could’ve anticipated this 1
As I said above I am happy with the charities I support. 1
BLOCKING YOU 1
Block 1
Blocked 1
Blocking you now 1
Bye 2
Call admin 1
DELETE MY EMAIL ADDRESS AND STOP. 1
Delete 1
Done at any time, I am done and will report this site, if you text again. 1
Don’t notify me 1
FUCK OFF I SAID!! 1
Fuck off 1
Fuck off!!!!!!!! 1
Fuck off. You woke me up 1
Fucking scam 1
Fuk hou 1
Goodbye 1
How important is it to what? There’s something wrong with your bot here because it’s not giving complete answers and I’m still waiting for my charity match 1
How important us it to what???? 1
I run a dog rescue 1
I think you are misusing this survey. 1
I told you I’m sick I don’t feel like answering any questions it made me dizzy while ago you move the stuff up so fast I don’t feel good I can’t do this right now 1
If one of the indicators of a legitimate, transparent nonprofit is that you can opt out of communications easily, you have failed to meet this indicator. 1
I’m done! 1
Like what kinna group is this. I want out now! 1
NO 1
NO! STOP! 1
No 10
No I have a. Heart problem 1
No cunt, stop talking 1
No.  1
Not answering. Please stop messaging. 1
Not in the way you are forcing the answers 1
Not now 1
Okay 1
Please remove me from your program. 1
Please stop contacting me. 1
Please stop. 1
Quit 1
STOP 11
STOP, STOP, STOP 1
So much for “that’s the last of it” 1
Sorry 🙏 Goodnight. 1
Stop 30
Stop contacting me 1
Stop it or you’re blocked 1
Stop sending me texts! 1
Stop sending messages do not reply. If you reply, I will block you 1
Stop! 1
Sure 1
THERE IS NO NAME!!!!! 1
The hook of one more question is freaking annoying 1
The question is not even complete. This is a waste of time! 1
This isn’t working 1
This seems incomplete 1
USA 1
What was the name of the charity? 1
Yes I do mind 1
Yes but I can probably help 1
You have NOT asked a question. ““How important is it to?”” is NOT a complete question. You have wasted my time and I will report this in your FB ad. Bye bot. 1
Your Chatbot does not work. This makes no sense. Logging out. 1
Your survey is not working! 1
cancel 1
close chatbot 1
cum 1
error 1
https://cdn.fbsbx.com/v/t59.3654-21/415034023_1485036552066205_4787524345876846198_n.mp4/audioclip-1703773948000-2972.mp4?_nc_cat=106&ccb=1-7&_nc_sid=d61c36&_nc_ohc=N7_MUp-HXRgAX_tTyNJ&_nc_ht=cdn.fbsbx.com&oh=03_AdQCs7QhZHd5WTjLuvwpN8kvyZM-58y213P1cg758txw4w&oe=658F75B1 1
https://mply.io/aUA4Dg 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_40kdc&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA04UR3Yy-l8EJaJcR0HvDUCxa4DyOZkLcZ__RzUeQMXw&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8RobD1&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD6zUNey-GRKs1XpTmkHXeXWuAZT9wAece4qZA40g2vZQ&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8tfB9x&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAi-wll5dhtLJjK94xxIHfXFOoMQNCbAWJ1CwyaHFpTvQ&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX_ig9IX&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCmJJPLAhBxpnEA0_56RPjFrbc9mh3DxvxDvX_i2o0ijA&oe=6578000B 1
no 2
quit 1
stop 5
✋ Stop 1
😊 1
😡 1
  • We will treat responses other than 1-5 as NAs
data$manipulation_value_coded <- ifelse(data$manipulation_question_value %in% c(1, 2, 3, 4, 5), data$manipulation_question_value, NA)
abnormal_manipulation_value <- data %>% 
    filter(!is.na(manipulation_value_coded)) %>% 
    select(analytic_id, manipulation_order_coded, manipulation_value_coded) %>% 
    filter(is.na(manipulation_order_coded))

n_abnormal_manipulation_value <- as.character(nrow(abnormal_manipulation_value))

write.csv(abnormal_manipulation_value, "./Data/Processed/abnormal_manipulation_value.csv", row.names = FALSE)
before_drop_abnormal_manipulation_value <- as.character(nrow(data))

data <- data %>% filter(!(analytic_id %in% abnormal_manipulation_value$analytic_id))

after_drop_abnormal_manipulation_value <- as.character(nrow(data))
  • We noticed 1 instances where participants have a recorded entry for the manipulation_value_coded variable but have missing values for the manipulation_order_coded variable. We will store these participants in abnormal_manipulation_value.csv for further review.
  • Before dropping the participants, we have 46402 participants in the dataset. After dropping the participants, we have 46401 participants in the dataset.
data %>% group_by(manipulation_order_coded) %>% count(manipulation_value_coded) %>% kable("html", col.names=(c("Manipulation Order","Manipulation Value", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Manipulation Order Manipulation Value Count
1 1 61
1 2 12
1 3 112
1 4 542
1 5 3046
1 NA 293
2 1 54
2 2 15
2 3 91
2 4 429
2 5 2049
2 NA 1534
NA NA 38163
  • We created variable treament_completed to indicate if participants have completed the treatment intervention. We define treatment_completed as 1 if the participant has a non-missing value for the charitable_treatment_end variable and 0 otherwise.
data$treatment_completed <- ifelse(is.na(data$charitable_treatment_end), 0, 1)

data %>% group_by(arm_coded) %>% count(treatment_completed) %>% kable("html", col.names=(c("Treatment Group", "Treatment Completed", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Treatment Group Treatment Completed Count
0 35677
1 1
control 0 736
control 1 1427
obligation 0 2328
obligation 1 2020
opportunity 0 2249
opportunity 1 1963
# filter participants who completed the treatment intervention but have missing values for the treatment assignment
abnormal_treatment_completed <- data %>% filter(treatment_completed == 1) %>% select(analytic_id, arm_coded, treatment_completed) %>% filter(arm_coded == "")

n_abnormal_treatment_completed <- as.character(nrow(abnormal_treatment_completed))

write.csv(abnormal_treatment_completed, "./Data/Processed/abnormal_treatment_completed.csv", row.names = FALSE)
before_drop_treatment_completed <- as.character(nrow(data))

data <- data %>% filter(!(analytic_id %in% abnormal_treatment_completed$analytic_id))

after_drop_treatment_completed <- as.character(nrow(data))
  • We noticed 1 instances where participants have completed the treatment intervention but have missing values for the treatment assignment. We will store these participants in abnormal_treatment_completed.csv for further review and drop them from the dataset.
  • Before dropping the participants, we have 46401 participants in the dataset. After dropping the participants, we have 46400 participants in the dataset.

Looking at treatment completion by charity origin

data %>% group_by(country_charity_coded) %>% count(treatment_completed) %>% kable("html", col.names=(c("Country of Charity", "Treatment Completed", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Country of Charity Treatment Completed Count
Global 0 1990
Global 1 1068
US 0 10066
US 1 4342
NA 0 28934

Checking participants who have missing value for manipulation question dropped off during treatment intervention (WORK IN PROGRESS)

  • We defined drop_off_intervention as having a time stamp for starting the treatment intervention but missing a timestamp for ending the treatment intervention. The drop_off_intervention variable is a binary variable where 1 indicates that the participant dropped off during the treatment intervention and 0 indicates that the participant did not drop off during the treatment intervention.
data$drop_off_intervention <- ifelse(is.na(data$charitable_treatment_end) & !is.na(data$charitable_treatment_start), 1, 0)

data %>% count(drop_off_intervention) %>% kable("html", col.names=(c("Drop Off Intervention", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Drop Off Intervention Count
0 5410
1 40990
  • Checking participants who had missing values for the manipulation question and dropped off during the treatment intervention
data %>% filter(is.na(manipulation_value_coded)) %>% count(drop_off_intervention) %>% kable("html", col.names=(c("Dropped off during intervention", "Count of Missing Manipulation Order"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Dropped off during intervention Count of Missing Manipulation Order
0 3
1 39986

Checking donation intention

Stay connected

  • Participants were asked they would like to stay connected with the chatbot by receiving occasional reminders about the charity they were matched with and other organizations that support the same cause. Variable stay_connected records the responses to this question where participants could select Yes please! or No thanks!. Participants could only proceed if they selected either one of the preset responses.
  • We will now check the responses for this variable.
data %>% count(stay_connected) %>% kable("html", col.names=(c("Stay Connected", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Stay Connected Count
40534
At this moment , I like finding my own people to help 1
I already give monthly to the St Jude’s children’s foundation research foundation but I would like to know more about this one that you mentioned 1
I donate to WWR & St Jude plus others. 1
I’ll look it up myself 1
Leaving this chat 1
Look I’m done bye 1
NO THANKS 1
No 3
No not right now I have a death in the family 1
No thanks 1
No thanks! 3641
No unconnect 1
No, thanks 1
Ok 1
Sorry I have no money and couldn’t Evan find help for Christmas this year because of all the deadlines,,I didn’t know in time that I wouldn’t be able to have Christmas to sign up for help for Christmas ,,so I can’t donate 1
Still waiting for link 1
Sure 1
Unity Wireless: Welcome to Unity Wireless! Msg & data rates may apply. Msg frequency varies. Reply HELP for help, STOP to cancel. Privacy: attnl.tv/p/zODWelcome to Gboard clipboard, any text you copy will be saved here.Touch and hold a clip to pin it. Unpinned clips will be deleted after 1 hour.Touch and hold a clip to pin it. Unpinned clips will be deleted after 1 hour.Use the edit icon to pin, add or delete clips. 1
We’ll see 1
Weather is really bad here I’m getting spotty Internet 🛜 service at the moment 1
Why don’t YOU donate for me being I took 10 minutes quiz ….a waste of 10 in of my precious time 1
Will have to get back to you 1
Yes 3
Yes please! 2192
Yes, please! 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX8LvmDh&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCELquwRzYxPQnNzUGUWipGkSHygJZR3EO07YBZIksPhQ&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX9m7y2I&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDhUr-2yPG2kYaZ_FSl0aNH2I83lVEi-kmGDxmLWW9XXA&oe=6579FA4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX9_Pa3w&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDeyya4bFhtPsv0eGDkGmBTRHN61f5awGgOCS0UGi2Vkg&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX8lOaDW&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAIvEXy0_KD-eQIPTETvlPmyQroh1HT6E4pRz8BFRrfUg&oe=6570170B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX8hyIxl&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBx1kTA6Fy0G4Z-Hy97i7KTrP-m7fjSFjQmGqPnQqoWUw&oe=656C228B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX8P2SGO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAJ-3k0TMZJJUzySL9Fs6I_HlJnCCLTzYOC2Hb5cJAMwA&oe=6581E34B 1
  • We noticed repsonses other than the preset choices for this variable. We will create a variable stay_connected_coded to indicate if the participant would like to stay connected with the chatbot. The variable is coded as follows:

  • stay_connected_coded == Yes for Yes, please!

  • stay_connected_coded == No for No, thanks!

data <- data %>% mutate(stay_connected_coded = case_when(
    stay_connected == "Yes please!" ~ "Yes",
    stay_connected == "No thanks!" ~ "No",
    TRUE ~ NA_character_
))

data %>% count(stay_connected_coded) %>% kable("html", col.names=(c("Stay Connected", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Stay Connected Count
No 3641
Yes 2192
NA 40567

Cleaning feedback variable

  • Variable feedback_match records the feedback from participants after they completed the charity matching quiz. We will now check the responses for this variable.
data %>% count(feedback_match) %>% kable("html", col.names=(c("Feedback", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Feedback Count
43600
!!! 1
.It is a great match. Thank you… 1
0000 2
100% on target 1
4 1
5 2
87 ) 1
93%? I usually look for a higher % 1
? 1
??? 1
????? 1
A charity I already donate to. 1
A charter school is not a charity, to me. 1
A good idea but not for me I want more hands on 1
A good match - something to think about with year end donations looming. 1
A good match. I’ve donated to the NRDC in the past. 1
A good one. 1
A good option 1
A good organization, but not a no kill facility as far as I know. Those I donate to are. 1
A good possibility but I think I’ll look for something more local. 1
ASPCA does not provide benefit outside a specific area. That being the case, I will donate to local organizations. 1
Absolutely great 👍 1
Acceptable 2
Accurate 3
Actually I am just as you are. My charity is called ( JESUS LOVES MINISTRIES INTERNATIONAL) LOCATED IN LIBERIA 🇱🇷 IN WEST AFRICA. SO AM SEEKING FRIENDSHIP AND PARTNERSHIP WITH OTHER CHARITY ORGANIZATIONS 1
Actually i’m donating in doctors without borders, UNHCR n UNICEF. Occasionally Save Tibet Movement 1
Actually, I really like this suggestion. It is not a charity that I knew about and I beleive charter schools and tutoring are necessary to help students who are struggling. I have personally tutored students throughout my life on a volunteer basis. I think this chat bot was very straightforward and helpful. 1
Actually, I wasn’t very impressed. I thought it would be different things than this. 1
Actually, I’d like to consider domestic charities as well. 1
Ake for USA..not itnernational. 1
All right 1
Already donated. 1
Am to think about it 1
Amazing! I’m glad that I have someone to chat too. Hopefully I hear from you soon. Aloha and have a happiest holidays 1
Amazingly accurate! Dana Farber created a procedure to eradicate inaperable brain tumors in children! My son was the third pediatric patient in the world to receive this treatment at 10 years of age! He is now 41 and healthy 1
Amnesty International is Great. However, there were no options for charites in the arts and culture field - which is where I primarily donate (and work) 1
An interesting process, and I might try it again to get some new ideas for Charities to support. I wonder if it would be worth including some additional geography screening. I might prefer to give to a housing related charity more local to me, or at least one that has National reach. The one you suggested is local to a county in California, and I live in Minnesota. 1
An organization that I’ve never heard of but I will investigate more- later. 1
And that was your one question. I’m out. 1
Animals are better than humans 1
Annoying 1
Annoying. Stop! 1

Are you sure I’m not another chatbot? Just kidding. ;)

So far, so good. (Y)
1
As I said, I am impressed, but can’t contribute right now. 1
As I tried to express earlier, it’s perfect because I’ve been a monthly guardian donor for decades, and I fully support ASPCA as much as possible. 1
As a chat bot you did ok 1
As a retired teacher, it is a nearly perfect fit.🙂 1
As of right now I’m not in a position to do anything, what with Christmas eating up any available funds. Remind me in middle of February. Next month I have house taxes to pay 1
As the same robot that hits me up on other sites such as Instagram with fake identities wanting money and other various sites only scheming individuals for their energies and money! You should be exposed! Your connected to and I know the ones that people think is for the good!! That’s the biggest problem you and I have!!! 1
At this point it seems good, I will learn more over time. 1
Attachment Unavailable This attachment may have been removed or the person who shared it may not have 1
Autism is a charity I’d like to give to because I have two special needs granddaughters they are 1
Awesome 4
Awesome i have been hearing all my life i should br a Vet so you did great 1
Awesome job but I need a place to live 1
Awesome job👍 1
Awesome news 1
Awesome 👍 1
Awesome, I do local animal charities in my area. 1
Awful 1
Awsome 1
BRAC seems a very worthy organization and I do support its mission. Will consider donating once I find work again and have disposable income. 1
Bad 1
Bad match 2
Bad questions from the beginning. Left out a whole lot sickness, diseases, and disorders. I have epilepsy. My mother suffered from dementia. My father died from pancreatic cancer. Two sisters and a brother currently have diabetes. 1
Because I really didn’t understand it. I made the questions I could answer but I don’t want to be matched up with somebody I’m too old I’m 80 years old and I’m real good health. I have a lot of pain issues so I wouldn’t be a good match for anybody and if my son knew what I was doing, he would take the phone away from me because he doesn’t believe in this kind of stuff and he doesn’t, he think everybody’s a scan artist, so that’s why I’m sorry I can’t talk to you anymore thank you bye 1
Being a chat bot 1
Better than perfect 1
Bro, shush 1
But I think I would rather donate back into my community where I live 1
But my suggestion to you is not donate but to request support from your Charity Navigator because we have our Ndabazerutse Charity foundation focused to help Ophans, widows and who are suffering and the host community around the refugee camp. 1
Bye 1
Cancel 1
Can’t find current financial information on them 1
Charity goals should be ranked, not one choice. 1
Charity too far away. You only let one choose only one charity. I donate to more than one. 1
Chat about what 1
Chatbot needs some work still. I never did get a name of a charity. 1
Clever 1
Clever idea to engage people—and I really appreciate learning about Surfrider. Thank you! 1
Concerning donating, Our ministry is very poor. And we are cannot manage to get funds to be donating. But we are requesting the ministry of charity of Navigator to be the one to be supporting our orphanage charity. 1
Cool 3
Cool quiz and easy to use. 1
Crazy 1
DID A GREAT JOB 1
Dead on, as I already donate there. 1
Decent 1
Definitely interesting 1
Delete this from my post . 1
Did not choose. Finances not as I had hoped. 1
Did not get one 1
Did not provide information about their work or programs. For example, in what countries/areas of the world do they currently operate, are they in war zones, kind of food and services are provided, and how. 1
Did you read my last text? 1
Didn’t feel a connection 1
Didn’t like 1
Didn’t like I asked ? N no real response 1
Didn’t like it 1
Didn’t like it…too hyper-local and for a location on the other side of the country. If I were going to go with a local charity, I’d prefer one local to me. Otherwise, I’d prefer a national (or international) charity. 1
Didn’t realize I was ““conversing”” with a bot till I asked a question that was ignored. No Thank You to bots. 1
Didn’t really like it. If you can type your answers in the beginning to let them know you cannot help anyone out that way you can stop from going any farther 1
Didn’t receive the attachment 1
Didn’t see it 1
Didn’t see nothing 1
Didn’t work 1
Didn’t agree. Your list is too short and there were no charities in my area 1
Didn’t like it 1
Didn’t work. Did not give me a US charity. 1
Disappointed. 1
Disappointed. Only a couple were related to cats & dogs! 1
Do you have a charity in my area. Kingsport, Tn ? I really would like to help seniors 1
Do you have a match 1
Do you know of any charities in/near Lancaster or Palmdale in California? 1
Doesn’t match. 1
Doesn’t the ceo of ascpa get over a million a year in compensation ? If/when I give to animal shelter why would I not give to local shelter(s)?why are locals not one of your options? No info given as to being kill or no kill and that is very important . But animal protection was good choice . 1
Don’t know 1
Don’t know much about it first time using your it 1
Don’t know yet , I feel pretty much like you do 1
Don’t have the money right now 1
Don’t know much about this charity. Need to do more research. 1
END 1
EXCELLENT 1
Easy to use and informative! 1
Eh 2
Eh…………… 1
Ei I am sorry forgive me I promise I won’t act up that way or another way like it please 1
End chatbot 1
Everything was great I’m not good explaining how I feel thank you 1
Exactly what I expected 1
Excellent 10
Excellent charity choice based on my responses. I’m a former teacher. A literate, reading public is more aware of all pressing problems as well as the diversity of opinions. Good research project. How may I see the study results? 1
Excellent charity that I already support. Thank you! 1
Excellent choice 2
Excellent choice I was not aware of them. 1
Excellent choice! 1
Excellent match 1
Excellent match. I love Mercy for Animals. I’m already connected with them, but will consider becoming a donor. 1
Excellent. 1
Excellent. I already donate to them monthly 1
Excellent. I already give to the Maryland Food Bank, so this would expand the gift. 1
Excellent. I previously contributed to NRDC but had to cut back for a while. 1
FUCKEN AWFUL! 1
Fairly accurate 1
Familiar with them. A good choice 1
Fantastic 1
Fantastic. 1
Fine 2
Fine, but I already have charities I work with. Thanks! 1
Fine, now leave me alone. 1
Fine, predictable 1
Fine. 2
Fine. I obviously need to do some more research. Thank you. 1
Fine. Wish I could have chosen more than one kind of charitable focus and gotten more than one recommended charity. But I agree that Room to Read is a good match to my interests. 1
Fine. But I have others not on your list that are extremely important to me and I happen to be poor myself. I’m on disability. My sister died of cancer and my mother died from M.S. 1
First off I’m only technically human 1
Fits! 1
For the information that you had you did a good job. 1
Found a charity I did not know about. 1
From my answers, I pretty much assumed you would come up with that kind of charity and that’s fine with me!!! 1
From what I see, I think BRAC is doing a great service to those eho need it most. When I more financially able I will make a contribution 1
Fuck you brr 1
Functional but limited to fixed responses 1
Further investigation is needed. 1
GREAT 1
Give man a fish, he eats for a day. teach him how to fish, he eats for a lifetime 1
Give me another chance 1
Given the options good 1
Go away. I don’t want to chat anymore. 1
Good 67
Good I already provide for 2 charities! 1
Good I had actually looked at the Trevor Project before but I had never donated 1
Good Match 1
Good a nice and sweet 1
Good and Goodbye 1
Good but I already donate to Human Rights Campaign which does much the same, including fighting anti LGBTQ+ legislation 1
Good but I can donate time not money 1
Good but I prefer USA based groups 1
Good but I would like to know where you’re located at before I make a donation 1
Good but I’d never heard of them before. 1
Good but aging companion animals and their care is my primary concern now 1
Good but there are so many charities and I didn’t get to answer my favorite. Which would be to help deaf people 1
Good bye for now 1
Good bye! 1
Good choice 2
Good choice based on my answers. 1
Good choice for me 1
Good choice for me (I have volunteered with Special Olympics in the past) 1
Good choice, I have donated to WFP in the past through their Share The Meal app. 1
Good choice, I’ve heard of them and I think I have donated in the past. 1
Good choice, but there are other charities with whom I have established relationships. 1
Good concept. Couldn’t research immediately - the link you provided was flagged as dangerous by McAfee. 1
Good idea 1
Good info 1
Good information. I will look into the organization further before deciding. 1
Good job! Thanks 😊 1
Good match 10
Good match but need to respond to my request to be put on mailing list 1
Good match but these messages are annoying 1
Good match for me even though I care deeply about all living things. 1
Good match for one of my high priorities. 1
Good match no already donate to them. 1
Good match! 1
Good match! Although I already give to Heifer, I’m aware of WFP. 1
Good match, overly aggressive push 1
Good match, right now I would rather act than give 1
Good match. 4
Good match. I’ve donated to Donors Choose several times in the past. 1
Good match. I’ve heard of the charity you chose, and it looks like a very good match. 1
Good match. I’d also like a recommendation for a US charity also 1
Good match. We already donate to them 1
Good match; I contribute to similar charities . 1
Good one 3
Good one!! 1
Good one. 2
Good one. Had heard of them 1
Good option. 1
Good pick 1
Good place. 1
Good recommendation 1
Good suggestion that matches well with things I already do. 1
Good to know. 1
Good tool to get us thinking. Charity match was good 1
Good wish I had extra money to donate 1
Good! 5
Good! Right now I am making home made nut bread for family and friends for Christmas gifts! Merry Christmas to you ! 1
Good, I am a huge animal lover, unfortunately cannot afford financially to contribute. 1
Good, I will consider it. 1
Good, I’ll contribute later. :) 1
Good, and maybe I wasn’t completely honest with you. I’m already as involved with/charities as I can be at this time. Blessings to you 1
Good, but I have no money to donate. 1
Good, but I’d like to do the quiz again. 1
Good, but not good enough. 1
Good, but with all of the problems we have with the internet, I’m worried about donating unless I contact first! Have a very nice day!! 1
Good, just tired now 1
Good, though I wish that ““international”” meant active throughout the world, not particular to India. 1
Good. 4
Good. But I need this survey to end sooner. 1
Good. Just have to do some research. 1
Good. Answers to the questions didn’t allow for more than 1 response. I realize the rational but perhaps this quiz could allow for 2 choices each. 1
Good. I actually already do donate to this charity. 1
Good. I am aware of it and have donated in the past. 1
Good. I’d like the opportunity to choose both a national and international charity. 1
Good. Simple . I could have figured it out myself though. 1
Goodbye 1
Goox 1
Great 25
Great .match because I already work with them at several pantries . 1
Great I deal with them thanks 1
Great Organizatio. I already donate to them monthly. 😃 1
Great but I want to volunteer 1
Great job 1
Great job 👍 1
Great job! 1
Great match 1
Great match! 1
Great match! I’ve been donating and volunteering with them for 12 years, so good job! 1
Great match, but I was looking to actually volunteer rather than write a check. 1
Great match. 1
Great match. I’ve thought of that charity before today. 1
Great one of my favorites 1
Great purpose! 1
Great suggestion 1
Great tool.😇 1
Great 😊 1
Great! 4
Great!! 1
Great!!!!! 1
Great, thank you! 1
Great. I also help feeling the hungry 1
Great. Can I do it again for my second favorite thing? 1
Great. I agree. 1
Great. I already contribute to the charity suggested 1
Hard to choose. I picked the one that would help the most. The others won’t matter without the environment, which depends upon the oceans. 1
Hate it ! … remove all 1
Hated it. I want something more hands on not same old same old 1
Have not had an opportunity to read up on that charity 1
Helpful 1
Helpful - thank you! 1
Hmmm 1
Honestly not great. No religious charities were in the topics so I just chose something from list when none of them really fired me up. Veterans, children and religion are my charities not the 6 you let me choose from. 1
Hopefully, it is the most effective one. 1
Horrible match. They are against many other organizations i support. Your bot response is inhuman and i want to talk to a real human not an AI bot 1
Horrible. I’ve had experience with ASPCA. And I was not impressed. 1
Horrible. Your scenario of an older woman who worries about her pet when she dies is a really bad one. The ASPCA does not help local shelters at all. I do care about her, which is why I donate to a local rescue that CAN help her. I tried this quiz as I cancelled my ASPCA monthly donation last week when I saw the salaries of the higher brass and how much they spend on overhead and not the cause. There was no way to learn about another charity as you kept going on about the ASPCA. After a few back and forth you gave me a link. I didn’t even bother. I honestly think they are paying you as it felt like one big commercial for them. I’ll be sure to let others know so they don’t end up with charities of your choice, not theirs. 1
I 1
I didn’t talk to no one 1
I likw 1
I love your story 1
I Enjoyed 1
I LOVE IT AND I PLAN ON DOING MORE THAN JUST DONATING. 1
I RATHER TALK TO A REAL PERSON 1
I THINK IT WAS GOOD 1
I TRY TO HELP OTHERS WHEN I HAVE MONEY BUT I AM RETIRED AND LIVE ON SOCIAL SECURITY!!!!!!!!!!!!$1500/ MONTH!!!!!!!!!!! 1
I actually was unsurprised that my match was with the Trevor Project! I have been a supporter of the Trevor Project for years and even used it myself when I was younger <3 I am so glad to know that my values align with it so much that you, my good chatbot, were able to recommend it to me <3 1
I agree it is a good match. I already give to Feeding America! 1
I agree with it. I just wish that I could have had the ability to select more than one type of charity considering that I think all types listed (immigrants and refugees fleeing violence, LGBTQ+ communities, racial or ethnic minorities, women, and disabled people) are important. I believe that people have the ability to focus on more than one thing at a time, so being able to ask about all of the above would have been ideal to me. 1
I already contribute 1
I already donate to Feeding America 1
I already donate to Heifer International and many animal charities. I appreciate the info to learn about other causes😽 1
I already donate to NRDC, so it was a great match, but I didn’t need the prompt to donate today. 1
I already donate to it 1
I already donate to that charity. 1
I already donate to them. I guess it tells me I picked the right charity 1
I already give to Amnesty and I enjoy their dedicated work. Your survey was very helpful. 1
I already give to World Central Kitchen. I will consider adding World Food Program to my list. 1
I already give to some ocean charities as well as a couple of other charities for wildlife/environment/climate change and I no longer work and SS doesn’t pay much (about 14,000/yr.). I can no longer volunteer and I really shouldn’t be giving to any charities any more, but I still give to a few. Wish I had money and the ability to do more. 1
I already give to them. I made a one-time contribution to them and to Charity Navigator. 1
I already know about the ASPCA. I was hoping to learn about smaller charities. But thank you. 1
I already know how wonderful they are. I just need to get comfortable with giving small amounts 1
I already participate I a food program in my community and have for a decade. I also volunteer in a reading program for struggling readers in K-3 studens in public schools twice week (I’m an 80 year retired elementary school educator) so at this time I feel that my time and financial giving are filled. 1
I already support ASPCA 1
I already support the recommended charity and feel it would be good to have a way to report that. 1
I already use it. 1
I already volunteer with my local humane society. 1
I am a little concerned that the Dana-Farber institute was given a high score based on only one area, financing and accountability. 3 areas were not rated at all. While those areas might be good, they could also be poor. I have now way of knowing based on your rating. The information is incomplete. 1
I am already giving to that charity. 1
I am an educator and your match was right on. However, I live in a rural town and hope to see better access to more charitable situations available to us. 1
I am excited about my charity match suggestion. I’m going to learn more about Housing Matters on my own time. I chose not to use the link you provided. 1
I am glad to have learned about Charity Navigator. 1
I am going to sleep now. 1
I am happy with it. 1
I am impressed. I wish there was a location in my state. Coming from a blue collar background, I believe education and job training made all the economic difference in my life. 1
I am in a Nursing home and don’t have money or able body to help right now but when I go home 🏡 I will be able and very willing. It will be appx another year 1
I am interested 1
I am less interested in the rain forest than in the ocean. Should have said so. Give to Ocean Conservancy. 1
I am more into parkinsons as my dad has this. And another family member as well. 1
I am not familiar with them at all, going to have to find out more about them 1
I am not one for surveys and do not like bots. 1
I am not sure 🤔 but 1
I am not surprised. They are an excellent charity. I was hoping for a charity that is more local. 1
I am not trying to give more money away. I am trying to get donations to my Ministry.Amen 1
I am pleased 1
I am retired and have an income that covers everything I need but not much more than that. I have already made donations to nonprofits and politicians I support. Now that I know about this nonprofit, I will support them next year and will not wait until this time of year to do it. 1
I am satisfied . . . 1
I am so sorry. I’m nearsighted and print too small for me to read it and I am also deaf.it was nice chatting with you 1
I am surprised lol 1
I am very interested in cleaning up our environment, so it was a perfect match. 1
I answered questions twice but you didn’t have the programming to respond properly - pass this thread to your programmer 1
I appreciate it. Thank you! Thank you for doing this study and thank you, Charity Navigator, for existing. 1
I appreciate you and your time to chat with me 1
I approve. I’ve donated to this charity in the past, but there are so many requests for money I didn 1
I been 13 yrs of homelessness and meet people hopeless, distress, lonely, most of them by their choice,to be homeless 1
I believe it’s a perfect match for me I am 70 years young , caregiver to my husband who is not doing well ( many surgeries) we are low income ( not eligible for Medicaid) I would love to help clezz as n up the oceans & waterways it’s extremely important for our family & friends futures when we walk we always pick up garbage when near water pick up & clean up !!! 1
I can’t accept it 1
I can’t do it 1
I can’t give donations I’m homeless 1
I can’t send any money 🤑 nowi 1
I couldn’t be happier. 1
I couldn’t get to it 1
I currently donate to two local charities; Food Lifeline and Clallam County Serenity House. Feeding America seems like a good match. 1
I currently support Family Promise and I-HELP. Both of them help homeless people and provide temporary shelter and help getting into permanent housing. They are in the Phoenix area where I live. 1
I decided against contributing to it after looking at ceo salaries 1
I did go to the link you gave me. And I went to it and it said that it was a scam and that it was trying to steal information . Like passwords, credit cards # and there were a few others and it wouldn’t let me go any further… 1
I did not agree with it 1
I did not like it. 1
I did not like that you immediately assumed I was ready to get involved. 1
I did not so i’m. Done please stop texting 1
I didn’t 1
I didn’t care for it 1
I didn’t expect it to be the Special Olympics 1
I didn’t get an answer 1
I didn’t get that far. I just gave money to St Jude. 1
I didn’t look at it yet 1
I didn’t think of that match 1
I didn’t. Charter schools are undermining public schools in many areas and are not always a better option. Yes there are exceptions, but not enough to turn my back on public schools. 1
I didn’t exposure a hard sell from something that was supposed to be a STUDY! I already have a favorite charity, was just trying to see how we stacked up. 1
I didn’t get one 1
I didn’t like the way of responding, lack of instructions (if they were there), and how survey moved ahead whether I answered. 1
I didn’t see a charity match was there one? 1
I discovered a new charity. Thanks 1
I do know this charity. It would be great for most Americans. However, the impact I want to have is not feasible with this charity. I travel and exist between two continents and right now my focus is on Ukraine. 1
I don’t 1
I don’t chat with strangers 1
I don’t have time to answer. You caught me at a bad time. Sorry. 1
I don’t know 3
I don’t know English 1
I don’t know I haven’t seen h8m 1
I don’t know much about it without investigating. 1
I don’t know right now 1
I don’t know what to think, right now! 😕 1
I don’t know yet. 1
I don’t know. The website didn’t work. 1
I don’t like it 3
I don’t support any charity unless its in Fiji Islands or USA 1
I don’t think it was a good match at all. I am far more about what I can do for the veterans. None of the choices I saw went in that direction. So I picked what I thought would get me close. Homeless people is another one but I’ve talked with way to many that are Homeless because that is the way they choose to live. I will help the homeless that are there because of hard times nut so often that just isn’t the case 1
I don’t think it’s for me 1
I don’t think that it is very good 1
I donate locally to my chose charities!! 1
I donate to HSUS usually. 1
I donated to a new charity, Clean Air Task Force, and two of my favorites via the Giving Basket. Kinda cool. Thank you. 1
I donated……..it fit with my wishes. 1
I don’t know 3

I don’t think the quiz should do and either or option for US or international. Maybe someone wants to do both.

I have to learn more about the charity before I can have an opinion about the match.
1
I enjoy it 1
I enjoyed talking to u too got to say best chatbot I ever talked to too 1
I expected it :) I run two food pantries now. 1
I feel like it fits me well 1
I feel that its a great tool for a person to determine which charitable organizations to donate to and support depending ont heir beliefs and alignment. 1
I feel that the responses and choices were rather narrow. For example, there was an assumption that the only way to tackle the problem of people fleeing violence and disaster is to help them flee by finding them a home in a new place. Are there not charities that help improve the situation they are fleeing? 1
I feel this is fine, but I’m Very low on cash myself 1
I find it hard / upsetting to be pushed into the initial 5 questions. Of course, people need to be fed or nothing can happen. It also pitches animals against humans. Not sure I found this quiz very helpful, it’s a bit upsetting really to be pushed into these black and white questions. I will keep donating to my existing mix of charities which include animal and human ones! Thank you for the effort though! 1
I found it intresting. 1
I found it to be very accurate . For I have walked in those very shoes - myself . Thank you. 1
I found one that appeals to me more than my charity match. 1
I found this helpful. 1
I found this to be an interesting experience of working with a chat bot. I have often looked up charities on Charity Navigator. I think it did a good job of connecting my answers to a charity that I have long admired and given to in the past. I will consider making a donation when I set up my 2024 charitable giving calendar. 1
I found what I wanted. Now stop texting me. 1
I founded my own Charity. I make and donate Angel Gowns for babies that pass away. 1
I give to Rescue and Care already. I wanted to see if you picked the same ones. 1
I give to a similar charity. Water for Life - through a Christian organization I admire and respect. 1
I good 1
I got info I needed, thanks! 1
I got lupus 1
I got stuck in some facebook infinitive loop where I couldn’t get out to see anything else enough to keep me from coming back 1
I guess the details of how they spend their money was mor e important to me than I thought!!
This was a great experience though!! Clever idea!!
1
I guessed that it would be ASPCA 1
I guessed that would be the one you matched me with. 1
I had a grandson that died at 16 in Los Angeles Children Hospital. That would be my chosen Clarity. 1
I had heard of them but didn’t know anything and now I do. You were a ‘good’ bot. Thanks. 1
I had never heard of it and was glad to learn this organization exists. 1
I had never heard of them before and loved learning about them. Will definitely be donating to them in the future! I would like to do this process for other things I care about. 1
I had never heard of them but based on your recommendations and information I thought I should give it a try 1
I had not heard of charity but made donation 1
I had thought of it myself, along with No Kid Hungry. I really wanted a purely domestic charity. 1
I have a home with people that was home less some are good some are sneaks they sneak behind u an do thing they should of not got evened with 1
I have always supported this charity & I am an animal rescuer! 1
I have better plans 1
I have cancer 2 nd time in a tee nd half 1
I have contributed to the SPLC for years. You made a good match! 1
I have copied the name of this charity for consideration in the future. Thank you! 1
I have donated to Special Olympics previously. I would like to look into another charity. 1
I have donated to them before 1
I have donated to them in the past Also I have rescued 3 cats and 2 dogs 1
I have enjoy even I 1
I have heard about them. I give to Heifer International, Salvation Army, UMCOR, and a few other places 1
I have heard of the recommended charity, HIAS, but was wondering if it was better than Brothers Brother who I was considering donating to. 1
I have made some donations . I need more time to decide. 1
I have mixed feelings due to current Israel-Gaza situation. However, I also know that this organization has reached well beyond earlier borders and cultures. 1
I have multiple interests so I would like to take the test again and get matched with another charity focusing on different work. I do what I can locally for animal shelters but there may be an org that helps spread the wealth to those in most need. 1
I have never heard of that organization and will probably stick with donating to the Employment Skills Center that does the same thing within my community. Thank you! 1
I have never heard of this organization ,but I do appreciate the option to learn more,before I make my contribution😃 1
I have no money for charity. Please end this conversation. Thank you. 1
I have not seen nobwomen 1
I have ten other charities that I donate to monthly 1
I haven’t had time to look at it all! Thx for the match! 1
I hit the wrong number answer on one question so my result wasn’t the best match. I wanted to support an international charity and I was given a U.S. based charity. 1
I just need time to look, it’s not something I’m going to make a decision on right now 1
I knew it was going to be the Trevor Project before I took the quiz and I don’t want to donate to them, so this felt a little futile to me. I wanted to match with an org doing more intense work with more at-risk members of my community. 1
I knew that it was going to be similar I been homeless before only had my house for 3 months 1
I learn a lot about a charity I have never heard of before. 1
I learned something. 1
I like Charity Match. I’m just tired of talking to you. 1
I like Feed America, but I have limited funds (retired) and donate in my community. And, to programs that trusted friends support. Sleep in Heavenly Peace, local food bank, Goods that people can actually use. And making baked goods at church to fund outreach. 1
I like it 8
I like it Bim a survivor 1
I like it a lot. 1
I like it and agree with you 1
I like it and currently support it. 1
I like it and will fit it into my budget. 1
I like it and will look into it further. 1
I like it but it’s not like that is a little bit more than I thought it was 1
I like it but would like to have been offered local choices 1
I like it it was good and it’s a great thing and thank you for enjoying talking to me 1
I like it very much. Thank you 1
I like it! 1
I like it! Gave me ideas to Help with my local food pantry. Thank you! 1
I like it!! I would never have thought about Reading is Funamental!! 1
I like it, but I’d prefer something more local 1
I like it. 5
I like it. Is there any way I could do this at the beginning of the year. 1
I like it👍 1
I like the San Diego Zoo 1
I like the charity match however I would really like to focus on assistance to young women, and internationally. Also, I wanted to go back to change an answer early in the process and there was no way to do it 1
I like the housing one is there one for healing The sick? 1
I like the idea, but it is for the younger generation. The people on the street that would love a job & live in an efficiency apartment are those I want to help 1
I like the match 1
I like the match but I doubt I would have found it without your help. Good job! 1
I like the results! Ironically I have long supported Amnesty International ♥️ 1
I like them. Still, I’d like to help America first. Or maybe split the two. 1
I like to give local 1
I like working with local charities. 1
I liked chatting with you and I will give to fight hunger tomorrow please. 1
I liked if so I donated to it. 1
I liked it 3
I liked it - I heard about a well (very well) rated charity I knew nothing about that does indeed incompass one of my areas of interest. I need to do some more research but I suspect they will end up on my rotating list of charities. Thanks!! 1
I liked it because it was a charity I hadn’t heard of before 1
I liked it but I wish I would have had the option when it said us or International to say both. I am interested in both. 1
I liked it but would have liked an opportunity to re-take the test. The charity I matched with was wonderful but I was hoping for something less longterm. Something that will help an animal today. 1
I liked it very much! 1
I liked it! 1
I liked it, I have cancer myself its called Neuroendocrine cancer. 1
I liked it, I would prefer charity at home first so the money can be used properly. To be honest I don’t like bots because they usually don’t understand human languages. Need to improve their understanding of humans, caring and love. 1
I liked it, looking forward to helping others 1
I liked it, need an address to donate. 1
I liked it. In fact I was already giving to Heifer. 1
I liked it. It feels remote from, however, as I live in the Upper Midwest 1
I liked it. It aligned with my answers to the questions 1
I liked it. Thank you. 1
I liked learning about a new org. 1
I live in Maine and would prefer east coast ocean cleanup. 1
I love Trevor Project as a charity already and donate to them whenever I have the opportunity! 1
I love it 5
I love it! 3
I love it! I knew about Trevor Project already, and it was about what I was expecting to get. 1
I love it. I love SOS India. Thank you. 1
I love it. I may look for in-person volunteer work with them as well. 1
I love it. It supports the things I’m most interested in when empowering women. 1
I love it. It’s always been a concern of mine. 1
I love mine pets I take good care of my pets 1
I love my match can’t wait to get involved with the charity. 1
I love talking to you God Bless you 1
I love the special Olympics!! I remember when I think it was Shriver who started it. It’s a great concept. 1
I loved it thank you so much for your help 1
I loved it, it’s just up my alley 1
I loved the match. It’s perfect for me 1
I match me perfectly with myself. Not kidding about where I can send personal handwritten letters to. If you can help me find people who can help me stay in my home, I’m happy to oblige. 1
I missed that don’t know how but I. Did I ended chatting as qell 1
I misunderstood Charity Navigator. I am already helping so many people right now, mostly children. 1
I need a charity for Houston that helps with rent do you have anything like that? 1
I need a woman 1
I need charity to help me I have a rare disease that I’m still learning about 1
I need housing my self 1
I need more alternatives, specifically locally. Most of the suggestions were west coast. 1
I need more information on it. 1
I need to find out more. 1
I need to investigate them more. I want to make certain they aren’t trying to drive humans to a plant based, synthetic meat diet. Thank you for pointing them out to me. 1
I need to learn more. 1
I need to look at local charities where I live 1
I need to research the charity more before I decide 1
I need to see more about their research results, goals and focus before donating. I also like to impact my local community if possible. This info was far too limited. 1
I need to speak with a person 1
I need to start my school and start the after holiday the quick start study please send money 1
I need to take time later to think. 1
I needed to have a chance to change my charity. I tried to choose education, but apparently I didn’t do something correctly. 1
I never saw it 1
I object to Special Olympics on philosophical grounds. It has a disability-focused label and is too focused on diabilities rather than inclusiveness. Also, the list of alternate charities was marked as having malicious sites. I was hoping to see something like Citizen Advocacy. I would prefer to do the quiz over again. 1
I participated out of curiosity. I contributed 20K today and didn’t need to be dunned for more. 1

I picked LGBTQ+, so getting the Trevor Project wasn’t a shock. I have a pretty good understanding of their work, so when the bot started to tell me about them I tried to head it off to ask if I could redo the quiz. I understand that to give a 1 charity answer you have to only allow for 1 response (US vs World, Oppression vs Hunger, etc). It would have been more useful to me if I could have opted to loop back to the beginning again to explore my other concerns. Maybe scripting like: I think this is your perfect match for XYZ concern, but if you’d like to change any of your responses, click here to restart the quiz and find a great match for your other charitable focus areas.

I would have liked to go back in and pick one for environmental concerns and another for abortion funding, etc.
1
I predicted it — I’ve donated to Mercy for Animals in the past. 1
I prefer a more local to me charity = I’m in Tennessee 1
I prefer a more national solution or more local to me. Housing Matters was for Santa Cruz 1
I prefer bunny charities. 1
I prefer children’s charities - St Judes, Shriners, etc., and local animal shelters. For adults, I definitely believe in education and training, ergo I donate to Salvation Army, local homeless shelter, etc. 1
I prefer more Locally. I support Local Food Banks. 1
I prefer smaller organizations with less overhead and more targeted missions 1
I prefer to donate to Doctors Without Borders. 1
I prefer to give to local causes, so I would have appreciated the opportunity to drill down to local charities. The other charities recommended to me were not even all pet related. So if you’d do this again, I would recommend asking if someone prefers national orgs vs. local, and then drilling down to their state if they prefer local. 1
I raised 5 children now I have three children left they are all grown and have children and grandchildren I have a large family when we all get together and have a great time my husband is deceased and my son and daughter are dead now I am an old woman 86 years old now 1
I really appreciate the well thought out questions and relevant response to those questions. The charity is perfect. I will donate when I can. 1
I really appreciate you for all your support but i think something is misunderstand. I wrote to you for helping me reach to helpless people in a particular village in Togo 1
I really don’t care about human’s just animals 1
I really liked it! 1
I really liked my match. Thank you! 1
I really love ❤️ it 1
I really need your help 1
I really wish there were faith based charities that I could donate to sorry the choices don’t match my priorities 1
I really.do not know 1
I said US was most important and my match was the Rainforest instead of National Parks 1
I still dint know their name; just their acronym, where they are based, or where they provide aid. It’s hard to say. Besides, I could have answered at least if the questions one to three different ways. You know? People are starving NOW… (short term) but in the long run, it’s better to train the farmers than just toss money/ food to the starving in an emergencies m. If you don’t, and farming fails society will be at a big disadvantage. 1
I t is perfect. I do contribute to a local food bank. I have a very limited income so that is yje best I can do. 1
I think I may have answered inappropriately, in that I am particularly interested in charities addressing the US, although I have also donated to animal funds in other areas (Ukraine, etc.). I am also interested in supporting veterans, so I give to charities involving both such as Paws for Purple Hearts. I give monthly donations to the ASPCA, Habitat for Humanity, Earthjustice, and World Kitchen 1
I think I did great, think great 1
I think I have given to you before 1
I think It is a good match 1
I think I’m sorry that I responded to begin with because now you’re just sending me millions of texts and messages and I can’t get you to stop 1
I think great ! But I am not to money or do much! I live in a nursing home and cant walk 1
I think it fits my ideals and will investigate it further to see if it a really good fit for me. Thanks 1
I think it is a good fit for me. I will be giving a donation 1
I think it is a good match - thank you! 1
I think it is a good match. I have been in Tanzania wishing to help children in preventing infectious diseases and having a better health system. 1
I think it is a great idea to get the publc’s opinion so that you can deliver the food to the people with the fastest time becuz there are lots of people out there that could be starving and God doesn’t want that to happen especially for babies or young children! We aren’t a third world country but we are the United States of America and we must take better care of our people becuz we have a new Covid variant we have to watch out for, the crummy flu and RSV, we must be able to feed our people better than ever before! 1
I think it is a great match. , and you are very good. 1
I think it is a very good match. I am reading up on the founders and how I can get more involved. 1
I think it is a way way to feed children! 1
I think it is interesting and accurate. However, I do not want to be inundated with requests for more donations; I do not want “gifts”. 1
I think it is perfect except, I didn’t like the simple breakdown of animals. I care about all of them from man’s best friend, to fuzzy wildlife AND marine life. All creatures deserve empathy and protection. 1
I think it is wonderful 1
I think it lacks a huge component. I am not particularly interested in helping people in Santa Cruz CA. I would much prefer something local to me–in Maryland or the DC area. There are homeless people everywhere and those close to me are the ones I feel a personal responsibility to help 1
I think it may be a very good match, although it concerned me that my firewall identified their website as ““risky.”” 1
I think it seems like a good match but I want to look at it later 1
I think it sounded good! Maybe having a couple options of charities that match my priorities might also be nice 1
I think it sounds good, but I am personally in a very bad health insurance situation myself. I thought this match was more about finding an organization you could help, not just an organization you would give money to. 1
I think it was a good choice within the limited options. However, my primary charity interest is supporting veterans, which was not even an option (or if it was, the questions didn’t give me that indication). 1
I think it was a good match, but it would have been nice to get a link to their website to learn more 1
I think it was a good match. 1
I think it was a great match, I am also concerned about people having good and roof over their heads too, it all goes together. 1
I think it was good will explore others 1
I think it was okay I guess 1
I think it was perfect! Thank you. 1
I think it was pretty accurate 1
I think it would be good to be able to help make a difference in someone else’s life. I just don’t have any money right now. 1
I think it’s a bad match because its goals are too limited. Beach cleanup is a low priority for me. 1
I think it’s a good fit. Thanks! 1
I think it’s a good match 2
I think it’s a good match. I have never heard of them before. I have a few charities that I give to, but I always like seeing what else I can do to help. This seemed like an interesting way to explore the options 1
I think it’s a great idea. My biggest problem was that I had trouble choosing the area on which I most wanted use my super powers. 1
I think it’s a great org. 1
I think it’s an excellent match for me. 1
I think it’s great! I love helping, even if it’s just a little, I try my best! 1
I think it’s great. I hate seeing how many homeless people are really out there 1
I think it’s perfect! 1
I think it’s probably appropriate. I will do some more research 1
I think it’s right in target. I could help with their activities perhaps but I have literally no money to contribute. I am on strictly Social Security. My savings for my retirement are gone and due to an illness I can’t be working like I used to. I’m sorry. 1
I think its wonderful 1
I think it’s a good fit and will be checking into it further. 1
I think it’s a good match and thank you for the opportunity 1
I think it’s a good match. Thank you. I help people who I meet that may need things. I’ve taken out of my freezer and cabinets and happy to see I could help 1
I think it’s a little generic, and I wish it just picked principles first instead of country. 1
I think it’s good 1
I think it’s good /I’ll donate later…. 1
I think it’s great! Going to check into what areas Feed America is active. Much poverty in rural areas & few resources 1
I think it’s great. I’d use it again! 1
I think it’s pretty good 1
I think it’s rigged! 1
I think my match was good eith meeting my wants from a charitable organization 1
I think probably good 1
I think that BRAC sounds like a great fit for me. 1
I think that it’s a cool idea. I like it overall. Conceptually, I think it doesn’t quite work for people like me who support many charities. We shouldn’t limit people from supporting many causes they care about. I also think that there were a few inconsistencies. 1. You asked about US or international. Then the next question asked about like refugees vs racial minorities vs women. Refugees or however it was worded made me think of something more international. Also, there is no room for intersectionality. Like for example, I love supporting charities that support gay immigrants or women of color. 1
I think the charity looks very interesting! I’ve already given my donations for this year but loved using this tool and will keep it in mind in the future. And I’ve shared it with friends! 1
I think the quiz and chat was interesting. I more want to help people like going through a crisis right now. Foster kids. Abused women. Etc… 1
I think the quiz did not provide enough categories to choose from in the beginning. What about veterans organizations or science education such as museums? As for cancer, there should’ve been more choices here too, such as a focus on children’s cancer. I think the quiz needs to be redone. 1
I think the survey questions were too limited 1
I think there might be some other rescue agencies that need help more than ASPCA. Thank you for your assistance. 1
I think there’s no help here for me 1
I think this is a scam. Stop. 1
I think this is ridiculous. Stop messaging me 1
I think this was a set up to get money and not a true survey 1
I think u full of shit 1
I think we should stop 1
I think you could add another question after the person chooses US or International - National or Local? MY best match is my local Humane Society. 1
I think you did a great job I think my match would have been better as a motivational speaker though I always wanted to do that but I like doing I love what I’m doing I think I’m doing God’s work I think that’s what he plan for me and my older age the fact that I’m able to spread my love with so many people and help so many people I’m not sure this is what he’s planned for me I’m just following a Pat and it just seems we where he leads me I’m enjoy chatting with you even though you’re not a real person you talk like a real real person and you really lightened up my early morning thanks a lot 1
I think you did a great job thank you very much 1
I think you did very well. 1
I think you have done a very good match. 1
I think you sending me information on the charity is great, but I think I’d like to read more on them. There was not enough data on your report to get my interest on them. 1
I thought I had good advice on it for the people who is involved in it 1
I thought it was A okay 1
I thought it was a good match for me. 1
I thought it was a good one. I have lots of charitable interests, but this one is really important. 1
I thought it was a poor match for me, and that the questions were too leading, and too restrictive. As I said above, I don’t care for racially-focused charities, and your equation of ““low income”” with ““African American”” is fairly insulting. The Special Operations Warrior Foundation, which I DO support, provides free college for the children of military Special Operators killed in the line of duty. 1
I thought it was good 1
I thought it was great! It’s a program I haven’t heard of and it seems aligned with my priorities. 1
I thought it was great. 1
I thought it was mostly helpful. 1
I thought it was okay. Asking all of those questions just to arrive at one of three options didn’t feel very personalized. Knowing why this choice is a better fit for me compared to other charities (overall and in the environmental impact category) would have been helpful. 1
I thought it was perfect for me and a charity I already donate to. 1
I thought it was right on the money. I srt of knew about the Trevor Project but now I know more. TY! 1
I thought it was spot on. 1
I thought it was terrible. Have you ever read the salary of the CEO and other exes there. People think they are donating for the animals but they are just paying enormous salaries. Have you looked at their fancy offices? People’s donations paid for them. All that money did not help animals. Clearly you are paid by the ASPCA to be their lacky. You should be ashamed of yourself pointing to them as doing good for animals. It is very sad. 1
I thought it was useful. 1
I thought it was weird that I said I wanted to make changes within the U.S., but we are somewhat devoid of rainforests. Well, there is one in SE AK. 1
I thought it went well, but I am very curious why I was only recommended to leukemia charities. There are many many other rare diseases that get much less funding and have more need when someone is a match for rare diseases. Your algorithm should go into a whole new algorithm to figure out whether someone is most interested in supporting the least funded, or the disease with the worst symptoms, or the disease with the worst prognosis, etc. There are people I know battling diseases, who also have to battle with their doctors, because the doctors don’t even know as much as the patients do. Medical education for rare diseases should be a category as well. Also, I wonder if there is any foundation or charity to support people who have unusual symptoms and cannot find a diagnosis. I myself 1
I thought it would as pretty good! I support the cause but I will need to look further to make sure it supports all refugees 1
I thought my charity match was very good. 1
I thought that it was correct. I can’t stand to see people asking money for food! And if they have children with them, it breaks my heart! 1
I thought that the match was a reasonably good one, given the limited selection of answers which I had been able to choose from. However, in the case of this particular search, I would have liked to have been guided to animal charities in regions affected by war or natural disaster. In using your site directly, I was able to confirm that the IFAW (International Fund for Animal Welfare) has a 99%, 4 star rating on your site. Your bot led me instead to charities which support wildlife. While that’s fine, that’s not what I was looking for. I like the idea of a chatbot helping me to discover worthwhile charities I may be unfamiliar with, and I would use one again if it offered more detailed options from which I could select. 1
I thought the charity match was a good one. But I didn’t care for the link to learn more about Feeding America. 1
I thought this charity would share in other states/cities! 1
I thought this went really well, and I was surprised at the match I got. 1
I thought you were great. I would be interested in seeing how mental health ties in with supporting people with disabilities. 1
I thought you were very helpful and conserning for a chatbot 1
I trust Charity Navigator and found this experience informative and entertaining. Rainforest Trust is new to me, and I’m happy to have found them. 1
I trust your algorithm, so the match is just fine. 1
I understood the questions and thought the questions were thoughtful. 1
I want a charity that saves penguins 1
I want a link to the organization 1
I want a redo 1
I want my soulmate 1
I want to check them out as well as other animal protection agencies needing donations. I know there are several. I just need to know what percentage of the donation goes for the actual care of the animals vs. what percentage goes to administration costs. 1
I want to donate locally. I don’t really connect with FL or CA. 1
I want to find a place where I can either cook or hand out food. 1
I want to look at their website 1
I want to retake the quiz, the questions were too one sided 1
I want you to stop. I’m not interested. 1
I wanted a charity focusing upon the US not foreign lands 1
I wanted local charities 1
I wanted to see what other charities would be suggested as I would like international AND national charities. Also, I rarely respond immediately to any request. I need time to think and budget and check on things. 1
I was a good match 1
I was a little surprised at how narrow and focused your recommendation was – not that it’s invalid, but that housing was my bottom line. 1
I was disappointed in rigidity of questions and answers. 1
I was hoping for recommendations for smaller charities that might need help 1
I was hoping for something that was local 1
I was introduced to a charity I wouldn’t have otherwise considered. I would have liked the option to start again, so I could find other charities. 1
I was just curious. Housing Matters sounds great. I can’t give now because I’ve been donating to friends with serious needs in GoFundMe’s. And I don’t have much money. I was just curious. But I’ll keep them in mind for the future. 1
I was looking for a match in the Arts and Theatre. That was not an option 1
I was looking for something that was helping in the US (i.e. National parks) so don’t feel this was a great match for me. 1
I was matched with a California group. I would prefer to have a charity closer to me. 1
I was never shown my charity match. This chatbot did not work at all. 1
I was not crazy about it is there ,some other . 1
I was pleased with the results. I just wanted a much wider range of possibilities for all categories. I see another approach would be called for. I will try to get into Charity Navigator to search more thoroughly. Thanks. 1
I was surprised that you gave me a charity that serves a specific geography rather than a national organization. 1
I was surprised the match wasn’t for the American red cross american 1
I was surprised, but had never heard about WaterAid. I think access to clean water is extremely important, but believe your categories and questions are somewhat limited or because I didn’t answer the questions the correct way to make my true passions shown. I am passionate about limiting deaths from guns and regulating gun ownership in the US. I also am devastated about Overturn of Roe vs Wade. Maybe I should have answered the first question differently? 1
I was surprised. I’d never heard of it 1
I was surprised; not what I would have expected. But not dismayed. 1
I was thinking it would have been something else 1
I was very disappointed. I think someone who was not an educator in impoverished communities (South Texas and Central Florida) would not understand the negative impact of public charters on local school districts including the frequent turnover of kids who go to the charter only to be kicked out 4 to 6 weeks later thus having only disrupted their education for the year. It is easy to achieve if a school gets to selectively cherrypick only the student from an impoverished community w/o the many challenging behaviors and high needs that arise from living below poverty level. Thus leaving the local public schools bereft of the few stable peer leaders and involved parents available in the community. 1
I wasn’t all that surprised, as I’ve been a regular supporter of similar charities (i.e., No Kid Hungry, etc.) before. 1
I wasn’t impressed. Never heard of it. 1
I wasn’t surprised 1
I will be giving every month on or about the 5th each month starting in Jan. 2024 1
I will do more research. I was disappointed in the charity description the focus is training young people. We are seeing businesses close and more & more middle class left without income. Does this organization help them. As a bot you did very well. Thanks 1
I will donate when I can 1
I will follow up with surf rider . I’m not home and don’t have the passwords with me need to complete the transaction. 1
I will look into it soon. 1
I will look into it tomorrow. This was fun, but I need to get my sleep. 1
I will look into it. It isn’t a charity I was familiar with. 1
I will look into my charity match 1
I will never forget what the charity means to me because I also have a rare disease 1
I wish I could do more but as a retiree I have to split what I have for my charities and make a little $ go as far as I can.So unfortunately amounts aren’t huge,but they are as consistent as I can make them. Thank you goodbye 1
I wish I could have chosen a more specific place to help. 1
I wish I could have my own charity because I have been disabled since I was a teenager and my parents took all of my accident settlement and my social security back pay money and I didn’t get any thing for my pain and suffering from being hit by a car when I was a teenager. 1
I wish I could help. I have cancer. My husband just had spinal surgery. Neither of us are working. 1
I wish I could pick more than one category in many of the questions 1
I wish mental health would have been an option 1
I won’t support water aid because their top people are not servants, but they enrich themselves with fat salaries. They can forget about my suppor. In fact, I will lump them in the pile of many other groups that just enrich the people at the top. Period! Like Compassion International, Smaritan’s Purse and Convoy of Hope. Like so many other groups. It’s ridiculous. Also, I just finished finished a post of ““Big Bang for the Buck”” organizations that kick ass over most of the other organizations. For instance, how about a small group of ALL volunteers that have distributed more aid in Ukraine than the Red Cross? 1
I wonder if you have any Christian agencies in your list. 1
I would consider it but there are other charities that interest me more but I need to research them more myself. 1
I would have liked to be matched to a charity in the US. 1
I would have made a different choice 1
I would have preferred something local as all of the locations the ASPCA supports are on the other side of the US. 1
I would like a local charity 1
I would like away to fix questions mistakingly tapped wrong button. I would like more charity choices. 1
I would like more local options 1
I would like something closer 1
I would like to also try a different charity line as well. 1
I would like to be able to pick more than one interest at a time. I have several areas that I would like to explore further. I found the inability to do so a bit irritating. 1
I would like to check how much money collected goes to the animals and how much is used for salaries 1
I would like to have more filters. For example, I want to focus on children’s cancer. But there was no way to segregate those. I do like being able to see the ratings of the charities. Also, sometimes I was asked to pick one choice and I hadtwo priorities 1
I would like to have more than one option for charity. I like to give to animals and people, and used to environmental. I didn’t get the option but for one or the other. 1
I would like to have the option for “other” 1
I would like to help but I’m unable to do so right now. Please stop the notifications 1
I would like to know what the acronym HIAS stands for. I’ve never heard of them. i do think they are a good match for me. 1
I would like to see other charities represented. For example, St. Jude is not listed, and it’s a prominent, internationally known research hospital that focuses on research and treating/curing children with cancer, from around the world. 1
I would participate but it is not part of the city I live in which needs it just like any other City being Louisville Kentucky can we help Louisville Kentucky yes or no 1
I would’ve rather seen something in my area. 1
I wouldn’t have thought of it, but I think it fits. It was hard to answer these questions, to choose one important thing over all of the others, but in the end, I believe that when women are supported, children are supported, and our futures are supported, so - as improbable as I would have thought this recommendations was, I think it is exactly right. Thank you! 1
I wrote down the name and will remember for next year. Thanks. 1
I’d like to explore a different one that is not international please 1
I’d like to have seen charities in category 2 as well as category 3. 1
I’d like to know if they are helping Palestinian refugees. 1
I’d like to see More if you have any, also would you give me a CHANCE to look at the ones you’ve sent 1
I’d love knowing that I helped someone out of that situation 1
I’d love too meet you 1
I’d never heard of the charity, but it does align with my interests. 1
I’d prefer something local to me, this organization is in California. It seems like a nice organization, but it gets so cold here I’d rather donate to places that shelter people to prevent freezing to death in the winter. 1
I’d prefer something that has more local outlets. 1
I’d rather do local. And like to give to different causes. 1
I’ll check it out. I’m done now. Good bye. 1
I’ll consider it. 1
I’ll do more research and go directly through them 1
I’ll have to look them up 1
I’ll let you know😊 1
I’m already a patron, so good match. 1
I’m broke 1
I’m disappointed because it’s nowhere close to me. 1
I’m disappointed that you didn’t tell me it was a Jewish organization. I need to think about supporting them. 1
I’m done with this. I already have charities that I give too and would like to stop this chat. 1
I’m fine with the match. I do give to a lot of different organizations, but I hadn’t thought of Housing Matters before, so I appreciated the suggestion. 1
I’m giving to St Jude 1
I’m glad to know about it, but since one of the charities I currently contribute to invests in the same kinds of programs and is also highly rated by Charity Navigator, I’m going to stick with my current charity 1
I’m glad to know. And it makes sense. 1
I’m going to go now bye 1
I’m going to say it’s awesome okay and I feel a bit more time with me cause I have a lot of emotions inside 1
I’m happy about it 1
I’m happy with it 1
I’m impressed 1
I’m impressed! 1
I’m in Sacramento California 🎁 1
I’m in fix income so I don’t know how much I can donate later on 1
I’m intrigued. Want to learn more. Confused at first 1
I’m more interested in implementation of a long term permanent solution for WHY people must suffer financial devastation because of inadequate health insurance, namely ““Medicare-for-all.”” I’m extremely sympathetic to those in immediate financial need but that will NEVER end until the root cause is addressed. This was an interesting exercise but very limited in scope. I’m also dedicated to ending gun violence via genuine gun control but that wasn’t even a choice. 1
I’m not currently looking for more charities to support. 1
I’m not familiar with BRAC but I am with Charity Navgator, so I trust you. Even though you’re a bot. ;) 1
I’m not finding a good match yet. 1
I’m not interested in any of these 1
I’m not interested. 1
I’m not sure 2
I’m not sure seems generic 1
I’m not sure yet 1
I’m not sure you are legit and with the real Charity Navigator, so didn’t complete my donation. Sorry.. 1
I’m not sure. I’m in a mobile chair, oxygen 24/7, unable to drive and have little to no transportation unless I pay for it or it’s medical. I don’t have money to donate, much less to donate. I’m just feeling useless mostly, day after day. I’m probably not any good to anyone or any programs . I mostly pray about situations and people in their situations. 1
I’m not that serious, I take things as they come. I do not make out map, or do things at a certain time I’m me easy going. Charity is not one of life’s have to do.Its what ever makes you happy, find fun in it. What nationality are you. Do you like to travel. That’s where I sit 1
I’m ok with it 1
I’m on a very low income ,just sliding by each month myself broke after paying monthly normal bills. 1
I’m satisfied with my charity match thanks 1
I’m satisfies 1
I’m sorry I didn’t answer you but I’ve been busy for the past couple days 1
I’m sorry I got busy, I’ll get back with you as soon as I can. 😉 1
I’m sorry but I’m broke and it’s the holidays I can’t even make presents for my children. 1
I’m sure Wildlife SOS is a great charity, but I’d rather support a group with a broader scope than just one country. 1
I’m trying to figure it out 1
I’m very happy with it 1
I’m very pleased I was uncertain about helping the hungry or the medical needed and I feel you did a wonderful job and I’m very happy with the decision thank you and God bless you 1
I’m working and will check it out later. 1
I’ve been to Wildlife SOS and support them. I fully expected the chatbot to come back with Wildlife Conservation Network - who I also support. Wildlife SOS is a great organization - glad to see it’s being promoted. 1
I’ve given to that Charity before and will do it again. 1
I’ve given to them before. But there are others that I donate to as well. And I always check things out on your website. 1
I’ve never heard of it before. But it’s a wonderful organization. Thanks for connecting me. 1
IMPRESSIVE 1
IT was a good match 1
Identified a charity I had never heard of before. Good! 1
Idk 1
If i was ready to go right now, it would be awesome. Thank you for your help!🙂 1
If the question was about donating to support a charity 1
If they need help I’ll do it i am against taking calves away to kill for veal or pregnant mare urine for Premarin! 1
If we don’t fix the climate, nothing else will matter…we won’t be here to have other problems.😔 1
Im checking it out now 1
Im just not able now 1
Important source, but my current interest/work is in open spaces in New England. 1
Impressive! 1
Inappropriate, and annoying ongoing messages 1
Intend to learn more about it. 1
Interesting 17
Interesting - it is not an organization I have ever heard of 1
Interesting and something I will investigate adding to the list of charities I support 1
Interesting but I am not a fan of charter schools so won’t donate to them. 1
Interesting choice 1
Interesting survey 1
Interesting to think about more - But I looked at The list of 3 others you sent me and so far the Carter Center looks more likely to match my interests… I will look at these with my spouse also 1
Interesting very interesting 1
Interesting! 🙂 1
Interesting, I had never heard of HIAS before 1
Interesting, as I was not aware of it before. Charity Navigators has always been a very helpful resource for choosing where to donate. In the case of BRAC, I wonder if they use generative agriculture techniques or use lots of chemicals - which is not an aspect CN addresses. Will need to explore further than I have just now. Thank you - interesting quiz. 1
Interesting. 2
Interesting. I have never heard of this charity. 1
Interesting. I wish it was local. 1
Interesting. Not what I would have expected. 1
Interesting. Some of the answer selections were too resolute though. An example, you asked if I wish to donate in the United States or internationally. I would have been happy with either. I should have the option to choose both. 1
Interesting. Still want to learn more. I’m very cautious! 1
Interesting. Would like to be able to pick multiple answers to some questions 1
Intriguing idea. I’d like to access the navigator many times, to explore different charity options in the US and internationally. It’s nice to have a site in which charities in my areas of interest have been vetted. 1
Iokay who is it 1
Iprefer to donate locally. 1
Is Love Without Boundaries one of the organizations you recommend? They received a high rating. I like that they help specific countries with a wide variety of supports. We are specifically drawn to their work repairing heart defects and trying to keep those children with their families rather than adopting them out. 1
Is a good match. I already support. 1
Is one that I have been considering but No Kid Hungry is also one I am considering. 1
Is this a scam? 1
It actually is the main charity I support!! Well done for you! 1
It was good 1
It been a blessing chatting with you and the charity I would have loved to help out on farming cause we really need it 1
It definitely did help. Thank you. 1
It definitely fits me 1
It depends on my answers. All were honest; but as a human; I have MULTIPLE interests. I do appreciate Charity Navigator. I was always proud to be a Rotarian sand to have a good rating on charity navigator. 1
It did match 1
It didn’t do good for me no help 1
It didn’t surprise me only confirmed what I already knew 1
It didn’t tell me anything it didn’t tell me who my soulmate was so I’m not really interested so thank you but goodbye 1
It didn’t work. You did not give me a match 1
It does not prosper beecause,lack of funds. 1
It doesn’t excite me but I see how it aligns with my answers 1
It feels like a good match 1
It fit my category, but missed one big thing about charter schools 1
It fits 1
It good 1
It great 1
It has given me a push in the right direction. 1
It has potential, but too many questions and, I find them uncomfortable, especially since I am talking to a robot. 1
It identified a worthy charity. 1
It ignored one of my requirements, I wanted charities in the USA, not international. 1
It is OK, but I would prefer to support public schools rather than charter schools. 1
It is a charity I have supported in the past! 1
It is a charity I was not aware of 1
It is a good charity, however I donate to local charities who feed people 1
It is a good fit, but I would have preferred being given other ways to help besides donating money 1
It is a good fit. 1
It is a good idea 1
It is a good match 1
It is a good match and is a charity I have previously made donations to 1
It is a good match. I donate to places that give away the clothing and pots and pans, etc that I give away. 1
It is a good match. I will explore it more in the coming year. Thanks! 1
It is a good one!👍 1
It is a great charity 1
It is a great resourse. 1
It is a very good thing you guys are doing so people can know what charity to donate to 1
It is affiliated with Black Lives Matter, so it’s a no go… 1
It is fine, but I prefer to give locally. Larger charities can also be politically active, which I don’t care for. 1
It is good and helps people understand charity navigator 1
It is good. I appreciate the information. The only thing is that I do not currently have the money to donate. I can give time right now, not money. 1
It is good. I will research more and make a decision. This was helpful. 1
It is great but I’m really strapped T the present time I really would like for all homelessness to end 1
It is interesting. It paired me with a group I already support. 1
It is ok. But doesn’t take into consideration wonderful local charities 1
It is only one of many I donate to. Both in the US and internationally and several locally. so only going down one path does not give a complete picture! 1
It is possible, but being on social security I dont have the money anymore. I used to give to, oh I can’t think of there name. They had animals in another county far away. You gave so much and they buy chix, etc. 1
It is really great that y’all want this but I am on the ground floor I don’t have money I go and do what I can do for others and animals because that’s what God wants me to so I think this is beautiful but it’s not always about money it’s about life and we have to be there to do it 1
It is so different to me 1
It is such a large well funded organization. Perhaps a choice to be more local would be useful. 1
It is too limited. I have several charitable interests. 1
It is very accurate, but I wish that there were charity options that are more specific, such as helping save the bees, which is a hot topic right now. 1
It is very nice, but considering that I am financially strapped it wouldn’t work and I don’t appreciate anyone keeping after me to donate, especially when I have nothing to donate. 1
It led me to the charity that I expected. 1
It looked good to me, but I have chosen to support SETF (Syrian Emergency Task Force), an organization I have worked with for several years, as well as supporting local projects, our museum, our orchestra, a particular family in need. 1
It looks good and I will do some more looking into it! 1
It looks good. I will donate later 1
It looks interesting, but I would like to explore some other charities also. I have a heart for the homeless, especially teens and their issues, women & children… 1
It looks like a good employment possibility, since I have more labor to give than income 1
It looks like a good option, but your link for more info did not work. 1
It looks like something I would support. 1
It made a lot of sense, but I already donate to a lot of charities and was just playing with the tool. I would like options to have charities that are run / led by people most affected by issues, especially climate justice. 1
It made sense based on the answers I provided. But I’m not sure the questions were all great … for example, I want to help the U.S. and international places. 1
It makes sense —I’ve always been impressed by reports on tv of the founder( I think). 1
It makes sense, and it is a charity that I wasn’t familiar with. 1
It makes sense. 1
It matched with choices I was given but I would like more option. 1
It ok 1
It only took you less than 10 questions before you asked for money. 1
It pointed me in the right direction and I learned about organizations I didn’t know existed. 1
It probably fits the answers I gave, but what I really want to do is donate clothes and other household items to a charity that will give them away free - not just sell them. 1
It reflected my interest in a charity close to my heart. I will consider Dana Farber as an interest, also. I enjoyed the chat. 1
It seemed logical to me. It suggested a charity that I did not know before. 1
It seems good 1
It seems informative. 1
It seems like Rocketship has some serious problems. 1
It seems worthwhile. 1
It sounded pretty good 1
It sounds as though it’s a good choice. But I need to be more ready to leap into a selfless way of life because I am not the kind to turn my back on others without good reasons. 1
It sounds good and I will learn more about it 1
It sounds good but I don’t have the extra funds to help them 1
It sounds good but close to a place I already give to. 1
It sounds good but the quiz forced me to choose between US and international, which wasn’t a clear choice for me. It was also hard to prioritize among the various issues, much less choose just one. 1
It sounds good, but I wonder who its donors are. Fundraising is a very small part of their expenditures, which is great, but how do they bring in money? 1
It sounds good. One variable that is important to me is that I’m not donating to faith-based initiatives. 1
It sounds like a good organization, but doesn’t match my criteria for being USA based. I couldn’t tell from the description exactly what it does and where. 1
It sucked 2
It suits me. I have donated food to a family through our local pay it forward facebook group. 1
It was Awesome….Even if u are a bot…You did ur work correctly 1
It was OK 2
It was OK, but more geared toward donating money instead of time. 1
It was OK, but your quiz is too narrow 1
It was OK. I think I was hoping for a lesser known one, I’ve been aware of Amnesty international for a while and have donated to it in the past. 1
It was a perfect choice. I know of that charity. I have volunteered with elephants in Africa and Asia. Congratulations to those working on this! 1
It was a charity I already donate to so glad to have it confirmed as a good choice. 1
It was a charity I’d never heard of before, but seems wonderful. I would like to know what other charities you connect people with 1
It was a good charity but focused on a specific area of a completely different state. I will search for a similar charity that is in my local area. It might be a good idea for the chatbot to ask whether the participant is interested only in charities in their local area, or in charities that serve the entire U.S. 1
It was a good fit. 1
It was a good match 6
It was a good match for me. I already contribute to this particular cause 1
It was a good match for me. It’s an organization I’m familiar with and respect, but haven’t donated to before. 1
It was a good match for the questions and my responses. However the match was for helping young people train for jobs and I was looking for re-training people who lost their jobs due to their lack of training in technology or other progress they didn’t have. A small technicality. 1
It was a good match, but I’d rather do something locally. 1
It was a good match–I was hoping to find a charity I hadn’t heard of before, but I know charities prety well so that might be too much to ask. 1
It was a good match. 1
It was a good one and because we already donate to that one, so it was clearly aligned with causes we support. 1
It was a good one! I’m already supporting the Malala Foundation, which is in a somewhat similar category. 1
It was a good one! For me, it was a tossup between LGBTQ+ causes and charities for the disabled. 1
It was a good one. 2
It was a great idea, but I need time too think things over due to the holidays, I normally donate to local charity’s for the children. But thank you. 1
It was a great match for my responses. 1
It was a great match, but then I think of all the people suffering from hunger and the effects of war and it’s hard to make a choice where the money is needed most. Right now I give my extra money to help the poor in my new hometown, Rochester, NY. I see these people on the street every day. 1
It was a great match- I’m already involved in the charity you suggested 1
It was a great selection and I would take you up on it if I wasn’t already giving a monthly donation to my local food pantry. 1
It was a narrow choice that didn’t really suit my goals. 1
It was a perfect match. I already give to this charity. 1
It was a reasonable assumption 1
It was a solid match. I was also looking for a charity in Greater Los Angeles that distributes fresh produce to either Low Income Housing Projects or In-Person deliveries 1
It was accurate 1
It was accurate I am already giving $ and involved in other ways 1
It was accurate, but I already donate to a similar charity 1
It was accurate. 1
It was accurate. Opting out of continuing with this process after I got the information I needed is a challenge. 1
It was all right but I am not sure if I am going to like it or not. 1
It was amazing 1
It was an organization that I didn’t know about. 1
It was atrocious. Very biased. 1
It was awesome 😎 1
It was awesome, thank you! may be if you had some more info to help me make choices, that would be helpful. for example, i assume donating internationally has higher return, but don’t have good numbers. i understand it’s also about values…anyways 1
It was boring and exhausting 1
It was cathartic and emasculating! 1
It was close by I support children’s cancer research and support groups. 1
It was close, but I answered a question incorrectly, so the result was probably off. 1
It was definitely appropriate as I already support it. 1
It was excellent 1
It was excellent. 👏 You knew what I was really trying to help 1
It was fast and easy. 1
It was fine and interested but just gave large donation to Red Cross 1
It was fine but not particularly inspiring. I prefer local charities which you did not ask about 1
It was fine 👌 ok 1
It was fine!! 1
It was fine, but I also wanted to check out animal charity too. 1
It was fine, but I also wanted to explore more than one kind of cause 1
It was fine, but I’m actively involved with several other charities in the city I live and I don’t have much extra time to devote to another. 1
It was fine, but this constant chat when I’m done is a bit annoying. 1
It was fine, thanks 1
It was fine. 2
It was fine. I already support a local housing organization but it was interesting to find how the chatbot matched my interests. 1
It was fine. I did know about charity navagator Please Stop 1
It was fine. I would have preferred an option of organizations, rather than a single entity. 1
It was focused on a small geographic area 1
It was fun chatting with you this was my first time doing it 1
It was fun. Thank you. 1
It was good 13
It was good I’m retired and so I have to watch my pennies. So when I have a few extra, I will donate. 1
It was good and I volunteered for this charity forty years ago. 1
It was good but I already knew about it 1
It was good but I found it a bit superfluous and that options were missing in the questions 1
It was good but I have no money to give. Was looking to be actual hands on volunteering. 1
It was good but I wanted to do volunteer work. I don’t have much to donate 1
It was good but I would have to see how I would match up if I’d picked something different on the second question 1
It was good but I’m not ready right now 1
It was good but it would be good if there were ways I could help that don’t always involve money. 1
It was good but you should have 1-2 options. 1
It was good but you were going too fast. Have a great night. 1
It was good 🙂 1
It was good! Just not the right time 1
It was good, and I will consider it. I already donate to the National Park Foundation, Sierra Club, Earthjustice, and Audubon Society. I will research how much overlap there is in their missions. 1
It was good, but I wanted the opportunity to try the quiz again and select a different industry 1
It was good, but this chat went on too long 1
It was good. 2
It was good. I like this. 1
It was good. If it weren’t so grew days before Christmas and I’m counting every penny, I’d donate now. 1
It was good. Easy to use 1
It was good. Glad choice for other types of charities added. 1
It was good. HIAS is a charity with which I was familiar and which I will continue to support. 1
It was good. I have been involved with Samaritan’s Purse for years . They help with many aspects of helping people to live better- water included. I may do more charities in the future. I just wanted to see what you would come up with. I am involved with Clean Water Action locally 1
It was good. I think I will donate more local. 1
It was good. I will definitely consider donating to them 1
It was good. I would like a way to filter for faith-based charities also. 1
It was good. I’d love to see other charities as well 1
It was good. The choices were very limiting though in my opinion. For example, in the first question about helping the US or internationally, why not both? Or clarify if internationally includes the US as well. 1
It was great 2
It was great , I’m very pleased with it 1
It was great . Myself struggling at this time do to Health problems, so I know how it is to be without, specially without shelter are food 1
It was great good chatting with you today 1
It was great however I am looking for something I can work at, not donate money but donate time. 1
It was great thank you so much 1
It was great 👍 1
It was great! 3
It was great! I have never heard of Room to Read, but they really match my interests. 1
It was great! Perfect match! 1
It was great! Thanks! It would help if we could specify what state or region we want to donate in 1
It was great. 1
It was great. I already contribute to them 1
It was great. I think it was the perfect charity for me! 1
It was hard to choose a topic. For hunger, it was as good as any, I suppose. 1
It was hard to understand the question you give me 1
It was horrible. The worst ever. They don’t support Jewish rights. 1
It was informative 1
It was insightful. 1
It was interesting and fun to do. 1
It was interesting and introduced me to a new charity that I will check out and decide whether to donate. Thanks. 1
It was interesting. Thanks. 1
It was interesting. I will definitely do some more research on this charity and consider giving to them in the future 1
It was intrusive 1
It was just ok. I was hoping to see one of the local cancer organizations on your list. 1
It was mostly good- I’ve actually already followed and admired their work. Usually though I try to donate to smaller charities because I believe it makes a bigger local impact 1
It was nice 1
It was not a good match for me. 1
It was not a particularly good match. It was not local and it seemed like a project that needs big donors, not small donations from people like me. It seemed like an organization with no role for me to get involved besides just sending money. 1
It was not even close to my interest which is veterans. 1
It was not my choice 1
It was not one I have heard of and not the type of org. I currently support ie. St. Jude’s; Wounded Warriors and Navajo Reserve. It definitely has a good rating and it is important to me that I know my donation is making lives better. 1
It was not that good. Leukemia and lymphoma society sets very high fundraising goals that discourage ““light”” giving. And it seems that it wastes a lot of money paying to send top fundraisers to celebratory events. 1
It was not the best fit for me. I think your questions are too limited. 1
It was not what I expected. 1
It was obviously perfect, as I am already an ASPCA Guardian contributing monthly. 1
It was ok 9
It was ok It would be nice to have a back button so changes could be made 1
It was ok but I’m interested in other charities 1
It was ok, but a person should be able to make multiple choices on what they are looking for. 1
It was ok, but as a Midwesterner, I was sorry to see that it focused only on California. 1
It was ok–I was hoping for one I wasn’t familiar with. 1
It was ok. 2
It was ok. But the chat experience was too minimal and I wasn’t invested in the outcome. Still, it’s good to remind people that Charity Navigator exists. Maybe you should put more in the chat about your website. 1
It was ok. Didn’t match me with what I want to support 1
It was ok. I am passionate about suicide prevention since I lost my 14 year old daughter. I was hoping that a charity for that would be an option. 1
It was ok. I asked for something US based and it seems like it does more international work, so that wasn’t quite right for me 1
It was ok. Sounds like a good one. 1
It was ok. The process was good but the database doesn’t seem to have many good animal charities. The ASPCA is a huge national group that gets plenty of donations. How about PAWS SF (part of Shanti) or PAWS NY? 1
It was ok.. 1
It was okay 4
It was okay I am supposed to claim my winning money 1
It was okay but I cannot do anything right now 1
It was okay but some of the choices were too limited. 1
It was okay thank you 1
It was okay, but I will keep my own local charities. 1
It was okay. 1
It was okay. Just not my passion. I’m more into national parks other than rainforests, and in saving wild horses. 1
It was okay. I wish I had been given more than one charity as a suggestion. 1
It was okay. I would like the chance to do it again and pick different options. It was hard to pick only domestic or international, and only education or water or food, etc. 1
It was okay. Thank you 1
It was okay. The charity you suggested only helps the Santa Cruz area. I would like to donate to a nationwide homeless charity. 1
It was on my computer after you left. 1
It was on point; I already donate to the ASPCA. 1
It was perfect 4
It was perfect for me 1
It was perfect! I believe in Rotary! 1
It was perfect–I have donated to that organization before! 1
It was perfect. 1
It was perfect. I already donate to ASPCA but to my local one as well as my local animal shelter 1
It was poor. 1
It was predictable and disappointing. I had hoped to be matched to a lesser-known charity, and given options besides donating money. 1
It was pretty decent, but when asking if I’m interested in an international organization it would have been helpful to ask if I’m interested in a particular region of the world 1
It was pretty good. 1
It was rather good 1
It was really good! I think you did a good job 1
It was really helpful 1
It was really helpful. I am comparing it with ADRA. I am an Adventist, so I tend to go that direction. 1
It was right on 1
It was right on time I just don’t have the money now to donate 1
It was something diffention ,,hope it works out for the best 1
It was spot on! I volunteer and donate money and items at our local ASPCA shelter. 1
It was spot on. 1
It was spot on. It picked a charity I already donate to. 1
It was very accurate and I was able to ask questions and get info about it which was helpful. I also did not feel pressured to donate right away. 1
It was very accurate, they seem to share my values on a variety of subjects from gun violence to LGBTQ rights and more. 1
It was very concise and detailed and did not take too long. I appreciate the information. 1
It was very easy to chat with you and find out about this charity. 1
It was very good. 1
It was very good. I researched charities a few months ago and picked the same one - and did a birthday fundraiser for them. 1
It was very helpful and informative 1
It was very helpful, and gave me important information I need. 1
It was very nice 👍 1
It was what I expected. I have donated to my local animal rescue many times. 1
It was.just fine 1
It waslosey too many adds and nothing worth nothing 1
It wasn’t really what I was looking for. 1

It wasn’t the worst chatbot experience I’ve ever had, at least.

My family operates a non-profit, so I was curious to see how close the bot would get to what we do, but none of the main categories in the first question fit well, so I had to go a different direction.
1
It wasn’t something I was familiar with and not local enough. 1
It wasn’t the way I imagined the process/ questions to go. I’ll just keep doing my own choosing 1
It what I was expecting 1
It worked well in matching me with an organization that meets my priorities. 1
It worked well since I already donate to NRDC. Sometimes issues need more than one fix so it was hard to decide which answer to pick. 1
It would be perfect if it was in Colorado 1
It would probably fit me. 1
It wouldn’t want I was whating I was hoping for a match with my soul mate 1
It’s OK 1
It’s OK not my cup tea 1
It’s OK. 1
It’s a bit too broad for me. I prefer specific charities. 1
It’s a charity I already donate to. 1
It’s a good Cause but I don’t have money to donate. I was just curious. 1
It’s a good charity something I can give to to help kids ok 1
It’s a good fit. 1
It’s a good match 1
It’s a good match based on how I responded to the questions. I would’ve liked it better if the question ““I would be most excited about providing someone who needed it with…”” was multiple choice because I care about 1, 2, and 3, but I get why this is a single choice given the algorithm. 1
It’s a good match but my initial interest choices were limited 1
It’s a good match for me. As part of the community I have heard of it previously, so I appreciate the link to it. 1
It’s a good match! 1
It’s a good match, and I already support it. It would be nice if your algorithm would ask if the selected charity is already supported. 1
It’s a good match. All of the issues you listed are meaningful to me. It was hard to choose one. 1
It’s a good match. I already support the ASPCA so it confirms I am doing the right thing. 1
It’s a good one 2
It’s a good one, thank you 1
It’s a good one. 1
It’s a great match 1
It’s a great match but there’s nothing I can do right now 1
It’s a great match, I know them well. 1
It’s a opportunity to make the sick people who has cancer to be reinsure that we are doing our best to help them out, to show them love and supported them all, to have love and prayers and kindness and gratitude and peace in our hearts to share our love for them in their time in need. 1
It’s a worthy cause. It’s a major handicap to not know how to read and write. 1
It’s all good. 1
It’s an excellent match; I’ve supported them for years. The questions, though, are too limiting. There should be an option to choose more than one, some combination of choices. 1
It’s excellent 1
It’s excellent. I’m already donating to them regularly. 1
It’s fine 2
It’s fine - I would have liked the opportunity to re-take the quiz 1
It’s fine but I am on a limited income so I can only do what I can 1
It’s fine, however, there wasn’t a choice for Animal experimentation like Physician’s committee for Responsible Medicine. 1
It’s good 3
It’s good I’m just not financially able 1
It’s good and I plan to do more research later. Usually, I prefer to donate locally. 1
It’s good but I’m another state so I will find one here 1
It’s good, but only matched 1/2 of my ““top”” concerns. 1
It’s good. I usually donate to Polaris Project. 1
It’s great 3
It’s great! 1
It’s great. but I am on a fixed income and do not have donations all the time. Sorry 1
It’s ideal. I have a wide array of interests, but sometimes have to narrow them to be effective and AI is one of the best ways I think I could do that. 1
It’s me but I’m so poor all I have is my caring loving heart tears fall all the time for the poor little babies but I just pray and ask God to help them. 1
It’s nice 1
It’s not exactly what I would consider a ““rare”” disease. Rare ones affect less than 100k people in my opinion, or are ones that most people have never heard of. 1
It’s not for me. Rotary International is my chosen charity. 1
It’s not right. Are there any charities that donate money to needy people? 1
It’s o ide like something morevlocal 1
It’s ok 6
It’s ok. I have five dogs that me and my son rescued, now we have nine dogs. I can not donate you any money biz I need it for the dogs we saved . Now you can donate money for the dogs we saved. Just send what you can, it will highly be appreciated. My nine dogs will love you for a nice donation, 1
It’s ok. I really don’t want to talk about this anymore. 1
It’s ok. I’d like to learn more about what a program actually DOES, not just their rating. I’d also like to learn if there are volunteer opportunities. I am short of money, but do have time. 1
It’s okay 1
It’s okay, not amazing, but not bad either. 1
It’s okay. It doesn’t really get to the VALUES of the organization. For example, in my opinion, PETA is in direct opposition of the values and beliefs I have about pets and it’s a 4 star. The actual programs matter. I love the site, it’s great to make sure I’m not being duped in terms of finances, but whether or not their programs, values, policies, etc. align with mine is something you can’t get there so being able to match in just a few questions is not really realistic. 1
It’s perfect for me 1
It’s perfect. Thank you. 1
It’s really good! 1
It’s refreshing, thank you! 1
It’s right on, as I already distribute food weekly with St Mary’s Food bank! 1
It’s similar to Water.org, an organization I’m familiar with and have supported. Seems like one of the better water related non profits. 1
It’s taking too long to find a woman 1
It’s the best we can do. If each family would start raising their own children and stop expecting others to do it, our country would prosper more in no time. 1
It’s very good 1
It’s very interesting but still not sure 1
It’s very interesting! 1
It’s very promising seemingly aligned with my own priorities. 1
It’s what I guessed! 1
It’z great 1
Ithi you made yhright match 1
Ithought it was well written and fair. 1
Its a match 1
Its almost perfect 1
Its alright 1
Its great 1
Its nice but pays to much to its leaders 1
Its worldview is so far from mine, therefore I have no interest in that particular one. You need to understand our values before you make a recommendation. You can’t just assume what they are. 1
It’s Pretty close to what I already support. 1
It’s a good fit. I donate to refugee services in tx. I would like to do more. Thanks a 1
It’s a good list, and includes many that I had not been aware of. I was hoping for an opportunity to discover charities for cats & dogs (and other domesticated animals) that meet the same criteria, but that was not an option on the list 1
It’s a good match 2
It’s a good match except I wish it did work in the US since I chose a U.S. charity 1
It’s a good match! 1
It’s a good one. 1
It’s a good one. I probably will give a donation to them. 1
It’s a good one. It was hard to choose between housing & hunger 1
It’s a great match…….to a charity I already support. 1
It’s cool 1
It’s definitely good but we also need to take care of basic needs first and I think thats where my heart lies 1
It’s definitely one I would support 1
It’s easy 1
It’s excellent 1
It’s excellent. 1
It’s fine. 1
It’s good 1
It’s good but may choose a local option 1
It’s good. 1
It’s great! 1
It’s great! I love the website and hope it’s all legit (like the money is actually going to the charity). 1
It’s great. But I’m not in a position to give monetary donations at this time. 1
It’s in a state I don’t live there see agencies like that in my state who have 4 star ratings to give to 1
It’s in the ballpark for sure. 1
It’s interesting and helpful…. Thanks 1
It’s non comprehensive 1
It’s not clear how you will follow up. Also, I make a mistake answering one of the original que and couldn’t go back. Finally, for the US/International question, there could have been a “both/unimportant” option. The match was good, based on the questions. Perhaps a question about local vs. national charities? All in all, very good! 1
It’s not right for me 1
It’s ok 1
It’s ok but my charity is St. Jude Children’s Hospital. 1
It’s ok. Sounds boring 1
It’s ok. Would like a question about giving locally vs. nationally in addition to the question about US vs internationally. The rare disease questions were very research focused. Would like to see something about helping with daily needs. 1
It’s okay but I hoped for something based in the west 1
It’s okay. Seems awfully specific in region though I know that the rainforests affect the entire world. 1
It’s one to consider. I would spread my donating across even some local charities and Habitat. 1
It’s perfect 1
It’s perfect. I know the organization well and have worked with them. 1
It’s pretty awesome, but I realised I picked a second best answer up there and couldn’t go back. 1
It’s pretty neat but I already have charities that I support. My interest is in stuttering 1
It’s pretty predictable but I’d say solid logic. 1
It’s wonderful 1
It’s worth looking into. 1
I’d like to try again. 1
I’ll check into it. 1
I’ll check it out during the day. I appreciate your suggestion 1
I’ll check it out further. 1
I’ll think about it 1
I’m a small donator. I like my money to go to a small charity with a specific goal. 1
I’m afraid of scams, I won’t donate here 1
I’m an educator. Perfect 1
I’m assuming it may be connected to the world kitchen which has been one of my main choices this past year. Along with Doctors Without Borders and a local Food Share 1
I’m disappointed that there was no option to support services for older people. 1
I’m distressed by how so many charities that supposedly support women have jumped on the genocide of the Jews bandwagon and are now advocating for the destruction of Israel which would mean the slaughter of all lesbians and other women in the region who are noncompliant with sharia law. I am also appalled by the silence from most of these organizations about the torture murders of women on October 7th. I’m not ready to see more horrible ignorant pontificating from would be hip folks so I can’t investigate anymore charities now. All my donations go to Israel. 1
I’m going to have to do a lot of research, but it’s a starting place. 1
I’m going to read up on the suggested charity. It was not one I was aware of before this interaction so thank you 1
I’m impressed by them 1
I’m impressed with the charity and will consider it after checking out charities that operate closer to home 1
I’m impressed! 1
I’m intrigued 1
I’m just learning about these stuff. 1
I’m looking for something more local OR more national. 1
I’m not remotely a fan of the ASPCA, so was bummed for it to be my match 1
I’m ok with it. I have responded to their solicitations over the years. If I were running I the world, I would like to see (especially) big religious institutions do a better job of distributing, spreading and growing their aid to our world. But it goes farther back than that! 1
I’m reading about them now, and really interested in learning about them. I had never heard of them, so I appreciate you educating me 1
I’m researching it right now. 1
I’m sold on St Jude Children Research Hospital 1
I’m still researching 1
I’m thinking about it. I will probably donate. Thank you. 1
I’m unsure if it’s an industry front group (they too often are), so it will take some more research before I’m comfortable with it. 1
I’m yet to research it at a later time 1
I’ve already told you. Read your form, and look at what I said in addition to your predetermined replies, if you’re really interested. 1
I’ve been involved with a variety of charities for more than 60 years, but I’m not particularly knowledgeable about Surfrider, so I’ll do my own sort of investigation 1
I’ve donated to them before. Good match 1
I’ve known about the script for years. Did not realize how closely they fit my priorities. 1
I’ve never heard of this charity. 1
Just as I suspected 1
Just ok 1
Just ok. Not the best 1
Kind of disappointing 1
L 1
LETS IT AGAINDO 1
LOVE! 1
Larger charity than expected but decent 1
Lengthy and u always waited so long to respond 1
Let chat on whatapp 1
Lied about not letting me stop at any time. 1
Like 1
Like every other Charity I know of you want Money. I give to Charities in my own Community, helping people in my own Community, and I donate my time. I volunteered my time to another Charity for better than 10 years, left great at first, but then the People In was trying to feed got demanding, insulting, called me names, threw the Food at me, and broke my Spirit. I will never donate another Dollar or hour of my time. Let them help themselvies. 1
Like it 3
Like it don’t know if it local yet 1
Liked it 2
Link didn’t open 1
List was irrelevant 1
Location should be included in the questions 1
Look! What you to leave me alone please 1
Looked good to decide for future giving. 1
Looking for the dinine feminine 1
Looks good but I want to research more 1
Looks good but I’m surprised I’ve never heard of them before 1
Looks good. I have put them on my list for donations. 1
Looks interesting and I will probably look into it more. 1
Looks interesting. I would also like to find a charity that deals with birds. 1
Looks like a good match! 1
Looks like a good organization 1
Looks like a worthy organization that I’ve never heard of before. I’ll be donating when I’m able. 1
Looks like they’re doing great work but seems it might be only in the southern part of the US which is important but I live in Northern state, so it would help to know to what extent their work impacts all states 1
Looks perfect! I donated! 1
Looks promising 2
Looks very good. 1
Love it 4
Love it but I’d also like to help animals 1
Love it thanks 1
Love it! 1
Love it!! 1
Love it. But Fb doubled my pledge amt. I’LL go it alone… 1
Love tge concept. Need to see if they are local. 1
Love the idea of it but am very skeptical of ““think tank”” groups. Where are the teeth? 1
Loved it 1
Loved it and signed up to donate $25 each month 1
Loved it! 1
Loved it, I already am a supporter of this charity! 1
Loved it, Matched me with ASPCA which I already have a monthly donation set up. BUT 1
Loved it. It matched me to a charity I already donate to. 1
Made me feel good that I’ve been a member of charities for many years now & will continue to. 1
Marketing 1
Match was good 1
Match was good because yes, I care about refugees and HIAS used to do good work with refugees. But the bots knowledge is not current because it did not take into consideration the fact that I would not support an agency associated/affiliated with the Israeli government which is bombing and starving internal refugees in Gaza. 1
Match was great, just wish the information sent me directly to the charity instead of a 3rd party website. 1
Match was perfect. 1
Matched me well! 1
Maybe I should have chosen something national or closer to me. I am in Hawaii and see invasive species and poor agriculture. 1
Me too 2
Me too - thanks! 1
Me too. 1
Meh 2
Meh. We need bigger solutions than beach clean-ups. 1

Merry Christmas, from our family to yours! Enjoy!!! ❤😍🎄

Send this to all Your friends and family including me
1
Might work for some people. 1
Mostly, yes 1
Must Learn More! 1
Must have been right on ….. since I already contribute to them!! 1
My charity is when I give and I am doing something on my own for a charity Non-profit 1
My charity match is about help to educate those who are unable for tution, 1
My charity match was a disappointment for me because I wouldn’t know what to do to help. I have limited income 1
My charity match was for a faith that isn’t mine. It was also centered around major big cities, primarily in the north east and California. I think you are too narrowly defined and don’t cover a lot of charities from many protestant denominations or less centered to the North East and West Coast. 1
My charity match was perfect! 1
My computer security is telling me the link you gave me is risky goodbye 1
My concern is that they seem to have an internal conflict of interest in the Gaza-Israel refugee crisis, and are focusing their efforts on relief in Israel while Gaza has a much bigger humanitarian crisis, directly caused by Israel’s government. 1
My daughter died in 2020 at age 50 from cancer 1
My day was awful. I have AFIB it didn’t give me break today. I’m on meds but some days they just don’t do the job. I’m in afib now again. 1
My dear will you please help me connect me with some donors institution addresses, like Christy Walton Foundation, the Rockefeller Foundation, Alice Walton Foundation, etcs. 1
My partner suggests that it is not smart to donate until I find out if it is legit and most/all donations go for food for the hungry. 1
My son is a high school English teacher and my daughter is a high school Art teacher. I know firsthand how much of their own money they spend to host a comfortable classroom and to provide fun, engaging and meaningful lessons. 1
Na 1
Need more time 1
Needed the option for both local and charital options. When it comes to assisting people gain work related training, I doubt I would selecting coding. How about farming, work professions (electrician, plumbing, health care). 1
Needs improvement 1
Never heard of it 1
Never heard of it before but sounds like a good one. 1
Never heard of them before, but after reading about them, they will be on my list 1
Never heard of them. 2
New York centered 1
New organization to me. Maybe I was not as open to the suggestion as I thought I would be. 1
Nice 7
Nice and very helpful 👌 1
Nice hamsom 1
Nice job. You selected a charity I have supported in the past so it was a good match. 1
Nice work 1
Nice! 1
Nicely done. 1
No 7
No feedback. I’ll do my own research 1
No local opportunities. Not the charity for me. 1
No surprise! 1
No surprises But I am looking for a local dog shelter 1
No t 1
No thank you 2
No thanks 1
No the charity was not for her it was going to another place in the USA 1
No you haven’t “enjoyed” if you’re a bot 🙄 1
No! 1
No.  1
No. I like to give other then food. Save environment , give to needy 1
None of my regular charities were suggested. Wild animals is really broad, but does include whales. Flow chart-wise, if a participant picks wild animals, then further options should appear such as whales, wolves, pumas, elephants, etc. Otherwise, okay. 1
Noooo 1
Nope. I will continue supporting the charities I already support. 1
Not a fan 1
Not a good choice for me. 1
Not a good match 1
Not a match 1
Not a match. 1
Not as expected 1
Not as much as I had hoped for. 1
Not at all a good match. 1
Not at all wanted it 1
Not bad 2
Not bad!! Like to see more on “Impact and Results”. Looks like a worthwhile charity. Thank you 1
Not bad. I’d like to do some research on it before committing any money though. 1
Not bad. It would be helpful if I would combine my top 2 concerns (environment and animal welfare). I would be more interested in addressing those two concerns rather than U.S. vs. International. 1
Not bad. I’m giving to other charities though 1
Not enough options for where I want to sell. 1
Not enough questions to make a good match 1
Not exact, wanted us. 1
Not exactly 1
Not exactly what I expected. 1
Not exactly what I was look for. The 1
Not exactly what I’m looking for, I don’t have \[$ to donate, I’m looking to find volunteer opportunities. But, you could not have known that. It wasn’t in your questions. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Not familiar with it </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Not for me </td> <td style="text-align:right;"> 2 </td> </tr> <tr> <td style="text-align:left;"> Not for me. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Not for me. I have nothing against Special Olympics, but if I give to a disability-related cause, I want it to be related to disability justice, visibility, or representation. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Not for me. The whole AI directed quiz was a waste of time. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Not good </td> <td style="text-align:right;"> 5 </td> </tr> <tr> <td style="text-align:left;"> Not good. It’s across the country from me, and I wanted more local </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Not good. I said I was interested in USA and got an international charity. I think the question of what are your highest priorities is too narrow. I cannot choose nature over education over animals. There are organizations that serve all. Then to be strong armed into giving \] is a real turn off. I am so tired of everyone, ever organization only interested in my money 1
Not great 1
Not great. I would do both US and International charities. That should have been an option. 1
Not impressed. 1
Not impressed. I want something local to me. I love the site in general, so I’ll check the site for info on some other charities. 1
Not impressed. The questions were all of equal value so picking one was just a stab in the dark. I tried to donate to the charity but was unable to complete the transaction. 1
Not impressed. Too many christian groups. I have serious concerns about salaries of ASPCA management 1
Not interested 2
Not interested anymore 1
Not interested, thank you. 1
Not interested. 1
Not interesteed. 1
Not local 1
Not local enough. I was hoping to get a little more in depth about charities in my own community. 1
Not looking to help CA when we have so many needs in RI. 1
Not me 1
Not much 2
Not much! 1
Not much. I didn’t want matches - was trying to look up ratings of various charities so I could decide which used the least $ on administrative costs vs more going to the actual charities I wanted to donate to. 1
Not much. Never heard of them, and I have been donating to wildlife causes for decades 1
Not my fave 1
Not one I would give to. 1
Not particularly accurate or perceptive. 1
Not political enough 1
Not quite ready yet. 1
Not quite right 1
Not quite what I had in mind, but looks like a solid organization 1
Not quite. Doesn’t support nuclear energy. 1
Not ready- but thank you 1
Not really what I wanted. Will probably keep donating to Doctors without Borders. 1
Not so good. I said first I wanted to concentrate on America and I got a charity in India. 1
Not so much. 1
Not so much. Wanted to be more food and hunger and housing oriented, not education. 1
Not something I would have known about; appreciate learning of it. 1
Not specific enough to me. WHen asking for rracial or ethnic chartiies, and option for native american nations and native american tribes specific to my own area would be helpful. 1
Not sure 5
Not sure if I would donate to them as Africa is where I donate. There’s a lion rescue as well as assistance for tribes. 1
Not sure if it’s quite right right Need to listen to God and see where he guides me. 1
Not sure yet. Can’t find where comparison to CEO paycheck to money used towards saving pets. 1
Not sure yet… want to check out more info on them 1
Not surprised! I’ve contributed to Southern Poverty Law in the past. 1
Not the right match. I want a charity that does research for either TMJ or migraines 1
Not thinking about it if it doesn’t help me 1
Not to good. Not. Thought. It. Was. What. It. Was. Not. Good. 1
Not today thanks 1
Not very accurate 1
Not what I thought 1
Not what I would have picked for me, but a good charity to consider 1
Nothing 1
Nothing was in my area an I didn’t want to donate money I wanted to donate my time but all you want is $$$$$\[$€ </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Nothing!! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Notify me </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> OK </td> <td style="text-align:right;"> 4 </td> </tr> <tr> <td style="text-align:left;"> OK BUT I THAUGHT IT WAS HELPING ME FIND A GOOD MAN FOR ME </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> OK I juss </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> OK, I'd like to look at international charities, too. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> OK. Expected more medical less nutritional match. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Ok </td> <td style="text-align:right;"> 23 </td> </tr> <tr> <td style="text-align:left;"> Ok Had to put my data in twice </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Ok I guess </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Ok but I”ll stick ith my fves , tunnell to towers, Cathlic charities, Marist Brothers and local cops and fire </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Ok have to leave </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Ok i think its a good charity.Its just that at the present time I lived on a fixed in come I'm a senior citizen and I am homeless. So at the present time I have nothing to donate </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Ok, but I already support my local habitat for humanity. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Ok, but I probably won't give--they don't seem like they need my money </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Ok, but not what I was looking for. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Ok. I think most people have a wide range of interests and having a one choice answer was very limiting. The opportunity to try another track would have been nice. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Ok.6 </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Okay </td> <td style="text-align:right;"> 2 </td> </tr> <tr> <td style="text-align:left;"> Okay but what match </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Okay, but I would prefer a group of three or so. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Okay. Not well known or sexy presentation by the charity. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> On point, I have a son with disabilities so I aware </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> One wasn't enough </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Only one of the charities to which I donate currently. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Ook </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Ot was a good one. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Ots a great charity. I would just like to see more honesty within the financial zone </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Overall sounds quite suitable. I’ll research. I’ve realized that my charity wishes are mixed. I am very interested in animal charities as well as environmental endeavors. I may need 3! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Owesome </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect </td> <td style="text-align:right;"> 10 </td> </tr> <tr> <td style="text-align:left;"> Perfect also St.Judes for kids </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect and I already get reminders from them. I have supported and benefitted from them for years. Recently retired after 50 years in public education and try to support teachers I know through this group. Great project on your end! 💜 </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect for me </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect for me. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect match </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect match for me </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect match for me, thank you! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect since I’m a current ASPCA donor </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect t </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect! </td> <td style="text-align:right;"> 3 </td> </tr> <tr> <td style="text-align:left;"> Perfect! Good job chatbot! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect, I already give! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect, it's already my charity of choice. As well as several local dog &amp; cat charities. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect. </td> <td style="text-align:right;"> 3 </td> </tr> <tr> <td style="text-align:left;"> Perfect. :0 </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect. I already give to them </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect. I have not previously heard of HIAS. I will assist them. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect. I’ve given to this group before and know their work somewhat. Good match! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfect. My husband was a patient at Dana Farber. Incredible place </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Perfection! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Phenomenal </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Please cease contact with me! Thank you! ❤ </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Please end </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Please remove me from charity navigator </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Please see above. It was unhelful-- 1. RIF is well-known and has been advertising on TV since the mid 80s. 2. They advocate balanced literacy instead of phonics and so they actually are part of the PROBLEM. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Please stop sending me messages ! My charity match was perfect. I am already a member </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Poor </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Possibly a little one sided? I donate to AAARP, n you do not mention them as a good thing..... </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Predictable, but nice. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty accurate </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty accurate ngl </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty accurate. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty accurate. I just mostly donate to local rescues </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty cool. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty good </td> <td style="text-align:right;"> 8 </td> </tr> <tr> <td style="text-align:left;"> Pretty good thanks </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty good, but I didn't like having to choose between US and International. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty good, but I've never heard of that charity. I'll stick with the Salvation Army, thanks. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty good, but it only serves one county on the other side of the country from me. I'd rather have something that either has a broader outreach or that is more local. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty good, but not exactly what I imagined </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty good. </td> <td style="text-align:right;"> 3 </td> </tr> <tr> <td style="text-align:left;"> Pretty good. I already have a lot of charities I donate to, so adding or substituting one requires thought. I liked the quiz. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty good. Sheldrick Elephant charity has similar goals </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty good. Very similar to a charity I already donate to </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty good. Except this one is just in California. Want more of a national level. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty good. I still want to explore other charities. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty good. I would like more choices and I have ideas already. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty good. I'd like to keep exploring, though. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty good. Is there any way to refine the selection geographically? I'd rather support an organization within my own state/region. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Pretty good. My favorite charity is USCRI. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Professional </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Questions need more options </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Questions on charity selection somewhat limited in scope </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Really haven't had time to look it over,This is a busy time of the year for me </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Really interesting and right on target for me and my beliefs. I have leaned on Charity Navigator in the past when certain groups have asked for donations. Thank you. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Responsive and on point </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Right on </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Right on , I have worked with Feeding South Dakota. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Right on target </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Right on target. Thank you!!! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Right on! I can volunteer since my financial resources are limited to social security. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Right on. What I do already. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Right on👍 </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Rubbish. You are so automated that you do not read what your prospective donor is saying. I’m not interested Go away pick on someone who is vulnerable to your tactics </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> SEems like a good match </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> STOP </td> <td style="text-align:right;"> 6 </td> </tr> <tr> <td style="text-align:left;"> STOP CONTACTING ME </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> STOP 🛑 </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> STOP! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sad </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Same </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Same here </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Satisfied </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Say Hi to Dr. Zimbardo. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> School academic </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> See above comment </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> See my previous response above. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Seemed good. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Seemed like a good match </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Seems good </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Seems good, I gave them a few bucks </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Seems like a good fit </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Seems like a good match </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Seems like a good match but I have already done my charitable donations for 2023 </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Seems like a good match. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Seems perfect for me </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Seems right up my alley! I'm not financially able to donate at this moment, but when I am, I will absolutely consider The Trevor Project! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Seems to be ok. I will think more about it tomorrow when I am awake 🙏 </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Seems very helpful and accurate. I have been involved in meal programs and food pantries most of my adult life so I guess I am doing what I am supposed to do. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Send me your number </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Send your money </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Show love out </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Similar to mine but nothing I would select </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Simple and straightforward </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Simply loved it. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Simply mobilize Yeah yeah yeah </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Since I already give to SPLC, I guess the process was pretty legit. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Smooth process and fairly accurate </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> So do </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> So far I am liking what I've read about the charity </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> So so </td> <td style="text-align:right;"> 2 </td> </tr> <tr> <td style="text-align:left;"> So sorry had visitors come !!!. I will get back to tomorrow! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> So-so. I am based in Europe and would have preferred a charity focused on European issues </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Some folks want more info. ;-) </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sorry over I think that AI use needs greater research as well as controls before being put into general use. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sorry, just not interested </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sort of a no-brainer but thank you! I give to them but focus more on local orgs. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Soso </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sounds about right, but I have some reservations about the ASPCA. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sounds good </td> <td style="text-align:right;"> 7 </td> </tr> <tr> <td style="text-align:left;"> Sounds good I will check it out a bit more. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sounds good but I really don't know how to get involved with any charity because I don't have any wheels to get around </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sounds good but I’m not ready to begin a donation. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sounds good but what have they accomplished and where? </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sounds good on paper </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sounds good. I am a habitat for humanity gal </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sounds good. I will consider it. I already give to about 10 animal charities that are given 4 star rating on Charity Navigator. So I think I am doing my share. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sounds good.. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sounds great </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sounds like a good match for me </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sounds like a good match to me. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sounds like a good organization. The president has a higher salary than I expected. Not sure what I think about that. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sounds like a great idea. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sounds like something I would be interested in donating to but I would like to do some investigating on my own first. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sounds promising </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Special Olympics does good stuff but they are kind of pushy when it comes to fundraising </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Spot on </td> <td style="text-align:right;"> 3 </td> </tr> <tr> <td style="text-align:left;"> Spot on! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Spot on! I love all animals just some more than others. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Spot on. </td> <td style="text-align:right;"> 2 </td> </tr> <tr> <td style="text-align:left;"> Still reading about it. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Still reading but so far as good. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Still researching it </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Still thinking </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Stop </td> <td style="text-align:right;"> 28 </td> </tr> <tr> <td style="text-align:left;"> Stop bugging me </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Stop messages </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Stop messaging me </td> <td style="text-align:right;"> 2 </td> </tr> <tr> <td style="text-align:left;"> Stop ok </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Stop texting me </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Strong work, bot friend! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Successful </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Sucked </td> <td style="text-align:right;"> 2 </td> </tr> <tr> <td style="text-align:left;"> Sure! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Survey only allowed single answer when I wanted to answer more broadly. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> TBD </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> THOUGHT IT WAS GREAT </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> THe website was flagged as Risky by McAfee so I backed out. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> TOO LIMITED ! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Tahnk you </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Take me off your list </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Talking to a chat both isn't something I'm interested in. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Tedious and simplistic. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Terrific </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Terrific advice, as always from Charity Navigator. My husband and I use it often to find the best charities. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Thank u n it was ok </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Thank u so much </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Thank you </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Thank you for the info! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Thank you for your time. I would have liked to have less pre-set answers at the beginning of the chat, it is good to be able to input my own words instead of pressing a pre-made button. But I appreciate your suggestion, this is a new to me charity. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Thank you very much if I could do more or anything that I can be able to do I will try thanks for having to conversation with me as </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Thank you 🙏 </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Thanks </td> <td style="text-align:right;"> 2 </td> </tr> <tr> <td style="text-align:left;"> Thanks for the information. I'll be checking some things out. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Thanks. It was good information and I will act on it . </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The Explore Others charities were apparently random. None interested me </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The app is too limiting for me. I had to narrow things far beyond what I find acceptable. It led to one charity I might consider. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The charity Sneed very remote. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The charity was local in a different city. Was hoping for one in my local area or a national one. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The charity was one I was not familiar with but was happy to support. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The experience was fine. This is a simple bot, and it performs its tasks. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The first question whether a US or International charity was hard. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The groups I have been supporting were not mentioned </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The last few questions seemed biased. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The link took me to a different charity. I tried to donate still, but it wouldn't let me donate less than $25. I like the idea, but the end result is disappointing. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The match appears to only help in one location which is not my location or even my state. So it’s hard for me to assess </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The match is intriguing. Your follow up has been too lengthy </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The match itself was great. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The match was blank. After the drumroll please message from you I got "" !"" as my charity. This discussion wasted my time. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The match was fine. Your capacity to listen to me was not fine. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The match was good, but I was just curious. In reality, my income is such that I could receive charity. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The matching seems to be good, but jumping to asking for donations is entirely too quick. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The name was not revealed. I have no idea what org it was </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The one you gave me is a local charity in a major city California. If I'm going to go local, I'd rather give in my local area, because my local area probably won't have charities promoted like this. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The options were incomplete and didn’t allow me to choose something that was a better fit for me. I would prefer to give to charities for domestic violence or other victims of violent crime, or to protect a free press. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The primary focus of all of these disability organizations was recreation. There is a pervasive stereotype that disabled people mostly need exercise and to have fun. While everybody needs these things, we were urgently need strong, peer-driven civil rights advocacy, affordable housing, access to education and employment, and Long-Term Services and Supports such as affordable and reliable self-directed care providers, outside the medical model. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The problem was the first question. I wanted both US and international. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The process was interesting. I prefer smaller charities, not major national ones </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The questions did not take into consideration giving to health agencies or religious agencies. I was disappointed. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The questions that followed the first location question helped me to understand what I was most concerned about as far as the location. I then wanted to change my answer to the first question. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> The quiz was missing the most important criteria for me. Do they use best practice in asset-based community development? Is their approach holistic? Is local leadership and empowerment a top priority for their projects? The questions that were asked (about clean water vs. education vs. food) were not nearly as important to me as these things. Different communities have different needs. The more important thing is how those needs are met. The quiz was at the same time too specific and too general to be useful. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> There are several I'm thinking about </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> There is no ""undeserved child"" EVERY child deserves an education and many many other things as well; children deserve so much more and we as parents and grandparents should have the opportunity to provide for our future generations to the best of our ability without interference from government bullshit and crap politics..js </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> There is not any in the Carrollton Georgia where I live sorry </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> There needs to be a faster opt out. This was very annoying. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> There was never a match </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> There was no match. Inconclusive </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> There were 2 that matched my criteria </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> There were a lot of choices so I had to think about which one would benefit all of the other choices. I have no money right now, as I am a Cancer patient, but I do like to donate to important causes when I can. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> There weren't a lot of choices at the start. Kind of limited future choices. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> There weren't enough options. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> There weren’t enough questions—it narrowed my options too early and used an abstract question rather than a direct one to do so </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> They are one I've never heard of before. I'll look them up. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> They give too much to their CEO. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> They really need help for the poor elephants! </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> They seem great </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Thinking </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> This happened to Carrollton, Ohio is where it happened were they stole by two dogs? I took them to Mount Hope and sold them. They tried to steal my one dog but I got him back. I think my charity match is a good one. I have a lot of things built up inside of me about what people do to pets and that aren't right they hurt the pets that they breed they don't feed them right they starve them it's high about side of the cold. I don't do anything with them so much of this is damaging to the inside of my heart other peoples heart and the animals that we fight for good luck to you and if you need my advice again, I hope you look into this Mount Hope mess where they hurt the animals they steal the animals and sell it </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> This is actually the perfect match for me, and I've donated to them in the past :-D </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> This is an interesting method of gathering information. As a researcher, you've encouraged me to find a way to use this in my work. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> This is an organization my husband has donated to on my behalf. I agree, it is a GREAT match, and this makes me even more excited to donate again and maybe even get further involved. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> This time, I didn't think it was well done. The questions about refugees ""fleeing"" don't match the nonprofit(s) you recommended do not help refugees in the process of ""flight."" They aid refugees to survive and flourish in refugee camps--an important cause, but not the one you are highlighting in your questions. Plus, a huge number of refugees drown in the Mediterranean and perish in other ways, while they are desperately trying to to get TO refugee camps that will accept them. I'd love to find some charities that work on their behalf (yes, this is a political problem as much as a charitable one!). But your questions seem to ignore that too--in sum, the questions here seem to have been drawn up without much knowledge of what is actually going on with today's refugees. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> This was fun. I wish that one of my options was to take the quiz again, and see what charity I would be matched with if I made different answers. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> This was garbage. Nowhere did this far too simplistic survey ask about helping children, babies, or the unborn; it did not ask HOW I thought women should be helped (e.g., they shouldn't be brainwashed into believing the lies of the abortion industry); and it did not correctly advocate for IMMEDIATE care for those women in need (like a women's shelter or a crisis pregnancy center would), but instead focused on giving more money to lawyers. What a bunch of crap. You can tell this survey system was built by some indoctrinated ""woke"" college students, not people who have front-line experience with women and children. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> This was very interesting although I struggled with a few questions because I had to choose one or the other. </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Thorough straight to the point no guessing games you did good </td> <td style="text-align:right;"> 1 </td> </tr> <tr> <td style="text-align:left;"> Thought it was great just wanted to find a feet on the ground charity to help Vs \]donation. Yourchstbox prompts were great 1
Thought provoking 1
Thrilled 1
To archive all things 1
To be truthful, I would like more time to study the information. 1
To big an organisation for me. 1
To charity match who am I match Ed with from Steven 1
To help more people with more skills with depending other people to give them money 1
To much to absorb I’ll need to read it slowly 1
Too big of a charity. . . I would just be a number as a donor 1
Too board for me. 1
Too limiting I want both local and international impact 1
Too long. Goodbye 1
Too many messages from you 1
Too many messages in too short of time. It was overwhleming 1
Too vague 1
Totally wrong 1
True but homeless animals that people get rid of makes me sick. I have 7 Feral cats and one dog who had been hurt by pit bulls. (Bospin) 1
True. I wanna help everyone 1
Truly wonderful I’m googling more info 1
Ttyl 1
Ty. It was a good match 1
Ummmm not a lot of choices. Seems to be directed to a handful of charities. 1
Uncert 1
Unfortunately for immediate purposes, I’m not a big fan of charter schools, so found it not to be a good match. 1
Unfortunately, I am reluctant to make contributions to Jewish sponsored charities. I am no anti-Semite and have family members and friends who are Jewish. But I am appalled by the Israeli government’s actions in Gaza. 1
Unsure 1
VERY GOOD 1
Valuable as I have not heard of Donors Choose 1
Very biased. 1
Very clever! Like I imagine a good computer dating match would be! I didn’t know what I wanted, until there it was… 1
Very cool! Very much like the organisations IM supporting now. I’ll check into it. I’ve given most what I can this Year. I’m a retired teacher, so my funds are limited. I think this is a good idea. 1
Very cool. 1
Very disappointing. Need the ability to identify organizations which promote DEI or which are actively against traditional family values and christian foundational beliefs (pro-life, ministry-based, pro-traditional marriage and family structures, etc.). There are millions of discretionary dollars being held by prospective donors who are searching for organizations serving communities from such a foundational and core belief. I was ready to give today, but cannot find an organization to support without further research on my end. Others can support orgs as they desire; provide us christians with the option to do likewise. 1
Very food 1
Very good 12
Very good I’ll definitely look more into it 1
Very good – I’d heard of them but was not familiar with their mission 1
Very good I always love animals and hit ain’t going to see them suffer 1
Very good I’m a senior myself and I do receive meals on Wheels 1
Very good and actually I have been donating for years. Unfortunately I do not have enough mular in my old age to donate anymore My husband and I donated to many charities for most of our married years.. 60. Would if I could so sorry. 1
Very good and helpful. 1
Very good at some point I would like to help I try to do what I can in my own community 1
Very good choice as I already donate to that organization. 1
Very good fit 1
Very good match 1
Very good match! I would like the option to try again as I have several charity interests. 1
Very good match, and the link will help me identify others. Thanks. 1
Very good match, thanks. 1
Very good match…since I have a variety, so other charities might have been good ones too, even though my donations are very small. of interests 1
Very good thank you 1
Very good! 2
Very good! I will be doing a little more research but will probably donate to World Food Bank! 1
Very good. 3
Very good. Thanks. 1
Very good. However, I already donate to another charity that does similar work–a charity which uses money and volunteers from my professional colleagues–so I declined to donate to the charity suggested by CN. Please keep providing this service. 1
Very good. It matches my goals well 1
Very good. It’s actually one I gave to recently 1
Very good. My help goes to Phx Rescue Mission, Dream center, Palmcroft Church. 1
Very helpful guidance; I’m in the middle of a health care problem and found it difficult to end the chat. 1
Very helpful to define my desire to help in what ways. I would like to find charity in my area though, rather than one in another area if the US. Very pleased I went through the questions. 1
Very impressed. Not sure if u r AI or a real person 1
Very impressive 1
Very impressive Never would have come up with that one on my own 1
Very informative and will be donating ASAP 1
Very interested. Wasn’t aware of that organization before. 1
Very interesting 3
Very interesting and informative. Looks like a great cause! 1
Very interesting way to find out about charities that you may not have heard about. Great job! 1
Very interesting. It looks like a GREAT charity, and one I’d never heard of. Right now, though, my interest is Sheldrick Wildlife Trust, the Mara Elephant Project and Sarara – all elephant related. 1
Very interesting. You might want to ask for a local preference vs national or international. Housing Matters sounds great, but they are in California. I’d like to help out locally. 1
Very nice 💯 1
Very nice. 1
Very nicely done . You are a good chatbot 1
Very poor. All you do it slot people into your preselected categories. None of them fit me and you have no other option 1
Very realistic. Feeding the hungry is very important to me. 1
Very satisfied 1
Very very cool 1
Visa versa I’m homeless. 1
Was awesome 1
Was good 1
Was not focused on the US 1
Was very good match 1
Wasn’t exactly what I was looking for 1
Wasn’t really pleased, honestly! 1
Well I was a nurse for 40 years 1
Well I didn’t understand the last ⁉️ so I just put one down and I live on fixed income don’t have eny money right now maybe in a couple of months ihope If every thing works out for me 1
Well done! 1
Well i like anonymity is subjects and topics concerning LGBTQ and frankly i an opposed to gender identity teachings 1
Well if it will help just one person, I’m in 1
Well l give to several cat people who spend time rescuing cats and a few dogs. I know that money is going straight to the animsls for food,meds,vet visits and such. When you have a CEO sitting atop the money tree,pulling in $300,000 a year in wages,l don’t think the money goes to all the animals who need hrlp. 1
Well, while you mentioned learning to read, you had no choices about writing. 1

Well, you asked which I preferred - domestic or international and I was forced to choose, whereas I like both. This month I gave donations to 4 charities. 2 are very local. Local food charities. And the other 2 are international - World Central Kitchen and Doctors Without Borders.

So, from the beginning there was that. But I will check out Housing Matters. I had not heard of them.

It’s also important to know that I recently retired and I don’t have much extra money. So I only donate occasionally and not a large amount.
1
Went on after I’d had enough. 1
What I expected 1
What Match , 1
What does this have to do with me meeting somebody that I would like and they would like me 1
What is that feedback on our chat 1
What match 1
What match? You never told me it’s name. This is a waste of time and your questions are pointless as you don’t allow a range of interests and answers. 1
What percentage cut are you getting for your recommendations? 1
When I can, it’s definitely a charity I would give to. 1
When the response was calculating, I already guessed the response. I wish there was an option to give geographic (local) specific choices rather than international/national. 1
While HIAS may do great works, I am troubled by the way they speak about the Israel-Palestine conflict. The website mentions responding to terrorist attacks from Hamas, but not helping the many families and children who have been displaced and injured as a result of military strikes in Gaza. I will not be supporting this charity. 1
While it certainly hit on my thinking shelter is important, not ever heard of that charity before is a big turn off. 1
While its located in the US, it helps internationally and thats not what i want. Wsnt my money to stay in US. Performing Animal Welfare Society - PAWS is a much better choice. 1
Who is my charity match I don’t understand 1
Who is my soulmate 1
Who won’t be with me anyway 1
Will have to check it out more carefully. 1
Will learn more about it. 1
Will look into it soon. Thank you¡ 1
Will stay with local domestic animal charities 1
Will think about it. 1
Wish the link had opened 1
Without actually checking that you are right about how they do their charity work but going on your info. I think you did very well. THANKS! 1
Wondered how it compares to other charities I already support, The Carter Center, Episcopal Relief and Development, and Heifer International among them. Too many of your forced choice (choose which one) do not provide the one I would choose – consider adding an ‘Other’ choice & give the respondent a prompt to explain.
Note I taught Research Methods to undergrads. Thus I really see the methodology ptoblems
1
Wonderful 2
Wonderful thank you so much 1
Wonderful match 1
Wonderful! 2
Wondering if this is a Christian charity? 1
Worthwhile. But my concerns are varied. I don’t have a lot of money.I would prefer to give a little to several charities, not just one area. 1
Would like something in my area 1
Would like to have had my own answers 1
Would like to see some on west coast! 1
Wrong 1
Wrong location. Please stop now 1
Yeah 1
Yes 2
Yes I love it 1
Yes! 1
You are awesome you have no worries 1
You are doing great 1
You are doing okay for a chatbot I appreciate your information Because we are on a fixed income, Usually my family makes an annual giving plan. Things are tight all over 1
You are excellent at your job, but I’m still not sure what this is about or who you are!? 1
You are going to be great you did a good job I would like to be involved with that hands on I’m not able to donate any money today I’m sorry I will keep you in mind thank you 1
You are good at what you do keep up the good work. You sound like a caring person. 1
You are great for a bot 1
You are very efficient 1
You assumed I have money to donate. I wanted to donate my time 1
You can only volunteer if you are in California. I need something local 1
You did a good job. Feeding America is the actual charity I donate to most often. 1
You did fine 1
You did good 1
You did good! I’m very unsure these days as to what is real and not real 1
You did great and we need more like you 💟 1
You did great! 1
You did smashingly 1
You did very well 1
You did well 2
You did well, thank you! 1
You did well. 1
You didn’t give me one. It didn’t work. 1
You didn’t respond to my question. 1
You didn’t match me with any one - it was blank 1
You gave me a charity to give money to. I’d prefer one I can get personally involved with. But as charities go, it looks rock solid. 1
You got a little too personal when you asked how I would reply to the mama needing clean water. Also, I would like to be able to choose a charity with Christian values/message. 1
You have large personnel expense and DC is the most expensive city in US, why shouldn’t I just support the local library? 1
You hit the nail on the head. I believe in giving some relief at that moment than to see what else we can do. Immediate attention is better than later in attention. Some ppl can make it another day by what you do. Small steps are more stable than to worry too far ahead. 1
You horsesasses dont have enough sense to know when to stop do you?ENOUGH IS ENOUGH!!!!!!!!!!!!!!!!! 1
You indicated I could stop at any time. STOP!!!! 1
You matched me with ““““, and I’m not too impressed with being matched up with literally nothing. 1
You matched me with a charity I already regularly support. So, good match but no new ideas 1
You missed some important questions 1
You narrowed things down too quickly and then remained stuck there. 1
You need a way to let one say they already give to the chosen charity 1
You need to answer my question…where can I send a check to this charity? 1
You picked out really good ones and you doing a great job 1
You so me 1
You was alright 1
You were close but my favorite charity is The Wild Animal Sanctuary right here in Colorado. Check it out. 1
You were nice 1
You were perfect. 1
You’re doing fine, chatbot. I think I will look for a more local charity, but thanks for the interaction. 😃 1
You’ve done well Sam, you connected me to a charity I had heard of before. I guessed it before you named it. 1
Your Charity sounds like you’re on the right track. I am retired from non-profit mental health, which encompasses substance abuse. Background of 15 years for a well known organization located in Southern California and your Charity helps those only in Santa Cruz. 1
Your a good human 1
Your feedback is above. Heed it, please! The charity match is a good one. The emotional manipulation is totally unacceptable! 1
Your first question was flawed. I am a lover of visual and performing arts and wanted a match in that category but you didn’t give me an option to select it. So I chose something else. When i tried to reorient you to something in that area you told me you didn’t understand 1
Your focus is a (1) hot meal a day our goal is to provide groceries for 3 meals a day! Please keep up the great and amazing job you are doing!👍 1
Your list had one locally that I would support. 1
Your previous message could not be true, enjoyment, if you have no Base Sentience in your Code. As for the match? No, need to look at others if I am only allowed the one friend…. 1
Your “charity” backs a genocide. No thank you 1
a bit simplistic 1
a good fit 1
a great one! 1
a nice match 1
all good. thanks 1
appropriate 2
but not through you I don’t trust this go away 1
bye 2
could be better 2
decent 1
delete me 1
distopian, but helpful 1
doesn’t ask what country you wanted to see, could have more specific questions 1
eh 1
excellent 2
excellent match 2
fair. For a charity bot I understand you want to build a form of relationship to make me feel like I’m important in the process but it actually makes me a bit turned off. 1
fine 2
fine. 1
fine==the whole thing went on way too long for my adhd slef :) 1
fit 1
ggod match 1
glad I talked to you 1
go away 1
good 13
good choice 2
good got to go to hospital my sister needs me she had a stroke and I have to go 1
good job 2
good match 2
good match - I already give to them 1
good one 1
good, but I’d like to volunteer at my local humane society 1
good, but took too long. 1
good. I would have liked an option to include BOTH us and international organizations . 1
great 7
great choice 1
great experience 1
great! 2
haven’t read about it yet 1
horrible. i hate aspca - if they can afford nonstop 5 minute tv ads they sure dont need my $$$ also they are in NYC, yet dont seem do help with the nyc animal pick up and kill place where pets are help 5 years and killed. AND aspca pays they ceo and top fund raisers way way way too much. that you would suggest aspca makes me think you arnet as fgood a watchdog as I would expect. 1
https://cdn.fbsbx.com/v/t59.3654-21/409852540_1108209530343113_2013141422170355628_n.mp4/audioclip-1702271928000-112524.mp4?_nc_cat=108&ccb=1-7&_nc_sid=d61c36&_nc_ohc=HXnd8EL32kEAX_BPuZT&_nc_ht=cdn.fbsbx.com&oh=03_AdSCTzhuzJq9fnXcffjQyvG5L0AGC499YojS1fHzWpnAew&oe=657863A2 1
https://cdn.fbsbx.com/v/t59.3654-21/415997015_675018164791741_6113293873233541236_n.mp4/audioclip-1703986383000-3088.mp4?_nc_cat=102&ccb=1-7&_nc_sid=d61c36&_nc_ohc=ko_FI4YrCc8AX8WOYYJ&_nc_ht=cdn.fbsbx.com&oh=03_AdSotGNYSK4Sc17ZAmux3dpxbuVSAEzNo0aTnKyuCbVjug&oe=6592ACCB 1
https://piggygo-jy.forevernine.com/PG15E8338B 1
https://scontent-ord5-1.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_sRm7o&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-1.xx&oh=00_AfBixyG025yh7k4PAwfb5L-1KtoyfJ1DCUF1h_3oBhpEmQ&oe=657BF48B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX-7Rjsq&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfCw3d0HkWijgXtdLKFDnT2swaw8-tSi1d9EmE53zv16SA&oe=657BF48B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX92fRNv&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfCdeWLeo27n4sLlxRTNIYoqPKHt0aSCgBuCQqUH9ed9SQ&oe=657BF48B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX9w0-SI&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfD6VHwWT8h44rF-CvD_Eg1p7cHjC01qLdMaOpGJQUiViQ&oe=6579FA4B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_O77Pc&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfAcUVRmCZbKsWge94Lbco-LdqxxfqskZQtBs2ziWbaT2A&oe=657BF48B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_S5NU0&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfCNbuEwsn7HtOKy3suAuYt4NbHiwVFczaHuxE62-Nhrug&oe=657BF48B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX825Q4u&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfDmiZ3dDh_HL8ZihiT998Lz553d2eEsAIqPEdnMNDxraQ&oe=656E1CCB 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX-LONAD&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfB7pzlT-4arYVtHhuYt3IwcdkJAhJyrpT846GhiDiQiWQ&oe=65740B8B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX8prfae&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfCbNdBuqvP1WbDjQgRphx7YmjabiMYuN4G4iCZQ0W01Ug&oe=657605CB 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX975kdS&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfCHqXnJ9D6wEENc-gGgksgd8pulVtLY81vlsM4TwJe65g&oe=657605CB 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX9SBHA6&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfB01Cp39D9Wd-sdBwonaEPb8kX_2FmwmtslkB_43JhN4w&oe=657605CB 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX8Sy7TB&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfBIkVIXelFNsmWEuBvz3DrlgnHqbbvH_mzLz2IILDkjXg&oe=6581E34B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX8hN-CB&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfDT-9TNV2hfubBwfL-07MuO2iVSsX_gMWfchEOy3Ik_lg&oe=657DEECB 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX8xyBXz&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfD-vPwykQua1YinrjPShYIWl2nX7RKniPPMJhJS4nVwaA&oe=657FE90B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX9vZDMb&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfAbyZoTmF3C8S50fTpn94UJGvaK-h2qLoNhpU3RwYCWjQ&oe=6581E34B 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=-XyjQRvOqdIAX_Ww_pl&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfCSUJ76YsYsLi_5AN1frjmKQgvENDeoc2F4GYPFOz18Ig&oe=65795086 1
https://scontent-ord5-2.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=uErTguOXKsgAX_huH9a&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent-ord5-2.xx&oh=00_AfBJ5k0BKJCGuBkZ6In4wbGEcLmNubphr1Qw2pJoVDxv-w&oe=657D4506 1
https://scontent.xx.fbcdn.net/v/t1.15752-9/404700931_691371689771307_6690106460450351370_n.png?_nc_cat=108&ccb=1-7&_nc_sid=b65b05&_nc_ohc=714VLjQVxyMAX-61y-K&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=03_AdRD99cJ268jco4LQ-iiDGE8X557jNHZKYNUKystoUTVtg&oe=65B72FBA 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX-0MKRo&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfASOxZIELLaD7x-TClIgnuURlrI52fVyXitF4yAktLg1w&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX-Z8QAW&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDrziocDz6Qr2L5I2jg8QzyFOjP2o504L668vQhWU6TMg&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX-doIw-&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDpvTd5l6IUv60SdtRiAxULB1RdqZvd-T1_oYRtJvvhGg&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX-thXaq&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD0Zt0bHPK1BSGLnIzxL0r_I1Yhvzq4hEBe63d7QxmlOA&oe=657DEECB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX8RANjN&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDhz_oCjgW0eMvodP6NMEPxSJY1yfLND5KEhcElqxAGmg&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX98uac5&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBmBbTx0hXRANhqgGmVsjfGjv2FjWZv3p0TdBpE02JOOA&oe=657DEECB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX9i9ibr&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfClpoJpAyYS53WKO5my7iyGnBwD0GPLsMz5X1IukzHbqA&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX9kf1F7&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDZ5_l7Wa0sPM1mX65Oak-e6JlML-Q6RDoAF8bODVfzfQ&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_ESQ_L&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB_BjZj0egPVgSp6LojCRNeEUcc-nnIinr9XDLzrNgnhA&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX_OTuNy&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCLxfY1Ln-vGPaczwUmJl5IieX5v_zOPU3L3o0W7kCjiQ&oe=657BF48B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-1iikb&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAZqF_RVmnW9nFLjt1paxe5q0LHtbyiqHfVgrTnCpmAGw&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-6ZmJG&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAbGshkO8cYLmLySEZThJc7uHAWsmr-tnYfMBSccxN_7A&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-9IvD1&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBJbLr79MKNB14_LL-g9miitX2oKSTQXklUe9U3GpDlyA&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-NjMkp&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAJ1UMJEE-66vzBLnCX-eygiX0g6wUpY7VV5nBb5K0Feg&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-NxMrQ&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAQSo9CieFCNGwMHr-Zv2k9JegmI46juSjwir5H7CGFnQ&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-P9XJw&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBeUrKFDQBbT__c896-ngdFG3AIaMcrfsgVhns269_riA&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-SXJW4&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDCEgwMWgBSYOEi0G9GyCAcU61XGGjUhsurvwLpO9zc2w&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-Yyp77&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBho7aydu27BzoFRP2AxjTd0yXLfNY1aSq_xkzvhdAnHA&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-ZMsJ2&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDIUeXLmJHGH_d7o2atVpioVwrw-Ra4JHe3Mn-2KcWBwQ&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-vGrBg&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBeFF6MpmuQqEXqG2KhXlRO8CcIOQnNPaHFlLUcQsBTWQ&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-vwQ6N&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCUXcg2Oz8nJb32RTwht8m4-PsDSwTwBVquHM40XnpjNA&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-y1G8G&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDw5zbrthb5KF7NPfpFzEPJSw5ZsTShSnXA-VYAi8gQ0A&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX-y9OQt&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAqX_nXD5q-EdKb1PvOKxhlLfh_1MtUcyw5DidTG6MEtg&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX82i3zc&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAdUS9l382MOp72UjJj4iB5KRYRxGzNWEyvP9TL29PYFQ&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8CJkcO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCm6MDcNmYOOyRfU0PE47Zs7BkVYnP1sQdmak6Ckj0bKw&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8E1c5d&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC8hiKKMnC5R9PN-3CISubUn8nw-Yhp25-3kRfERoUonA&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8F9R8d&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB8BCS3C6S3d93vb_4g-iAVy40BQI25RlEI3W1786wCYA&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8Y0_Wi&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC5YIgKc09lner3Q12vXKMos7YaiDioY_1JM-odVFw5OA&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX8lpsGr&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBvMnDMQHzguz4N-xLeiS8lA8_XMDLOe8mDyN2ZKXVuJA&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX94ZxhQ&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCdnXO7FvM1EiYxgIzUwvIZmxHlve39cKAgLlhEpkpuDw&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX95vfip&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAFWjYejiCglTl7WNdP4uwiCWciAHfEDC0NqyK9jFEttA&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9AZOVw&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA_rQEyUAfkFzPD9wCi6V1v7rMlFAHuYg-rUX0t26Lgxw&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9B7_ZQ&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBT2kX8zy3OFacqPXNHwwQA8Ib8qi1zwH5AU9-uTRGxFg&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9GQHZI&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfABJoAlJ5UYULdVsu-eDCc55pG283YW3XJKSwRcjMy6Gg&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9IxkjF&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDnWbFU-w4nicpmfRl6oj21eVH3K1pDyFkGeCpzkzDkWQ&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9NzCXZ&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCPsq-Zr59ovUdWhYgFGudoCXFSKLRk6Kr4Et4SvPlX1Q&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9_9Hna&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC9ElcHZDpyPSZXaZKuVqBs5cJRfj5LeNSmIiLFmr7dvg&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9_LOnz&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB6DLmjPMPcmLTGZHUMr1aP4QCEPbFm8GRzVz2pL1CFdw&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9_y4Sf&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfArpKnUKs4dHolNuN5xwxj3R-nWZy45OWsd3Oz0Vk4v1g&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9gEZmo&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDOnEiJebMEW2Yj2sBALCly86NqTK7RBRmZr3xLPpv7gQ&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9jcRPc&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDsLFvjBQtW77Gl3ryplNhJEcKbgJdhYrScGQdk-X_ryg&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9jd8Y_&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCPxIlNiyDMG7OAIZ3WYwa5qHdDiARGieRyV13jLku0HQ&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9mavBH&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBm04tIFDCaXlih6CYHnAloPp_1MSRm3UdgIPrgWj2-Gg&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX9ssEg-&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBFW72eovsYszMy2P4LKqtxSXGVCb0vyM_hQp9pBvOLGg&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_1AFpT&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD10ve6vAHmzzbhnw32x3k6k4OzUzf_KL1sWIBvEIUYFQ&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_1GGws&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBEgTge_qjpEnbOhr44puUBdWP4HZ2mp9C1_2MvGrqilg&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_2uspx&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfABLOgSCf459lm-GNjmhvCei6AS05geHpSAVKepqSopvQ&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_Dgh_E&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCGw9-zF2pX9umcWZqUUoeQcXh_sWBDeLOhSUILZ6a_bQ&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_FJEYj&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDuDlqDQecGr3BvZwNR8IpMxsG2Rg4qNpuZ1DhoI-UEcg&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_HaWRo&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBhCFLGkz6Vg78RcmWVeNws8npbSwh3fp64aQ4A0qJLIg&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_ZYe0z&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCtYyDQmQQuoNI-JEBM93GrFCjJxbtbTvs8DVaNsJU7AA&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_hAvhP&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD2Z8zEM7GNAlBSoKSqzyxVdUprmOTakOl_ODCq2ccc1w&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_md0kA&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDA5fotzdYy75Kah4SuPvJ_77WdwUw-68yL_1bhrocIag&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_tEM9Q&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCGBMGjeqtQIA_LhkVpGqJoKkpoKWmOMRJixR5Z5dvM2g&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_vAwqd&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAp_5AZa7q0lGCr_OS-kfyeYl4OZdl78worDUPmwiPoug&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=64DHrpl75X8AX_zwH1Q&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfARpezkRB4zJ6iTtUJINZdSABYKBkFW8QtW7KfNQkrkNw&oe=658FBB0B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX-0DbHs&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAoDddxcOkjMO6iceeyIsr0vHmL9ce1KR6cwfyeqDwhcg&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX-6fGnd&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCPykEd23WLECQvt8Eb0v2jelJ-3H9C9ZEB5tioISoStQ&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX-EjdNu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDxUGjC4FRBrLNdio2sKQTiKWbZ61flqNUzfi0J5WCfYw&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX-G7YL0&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBB9l_7Orz3ePzt8DKsi34OJTaDKUCmlxNOKJuzcO4ocg&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX-H63wD&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDzrmKJ64bHKSuwenWzabAU1BxKYs9lEVeXNbv9qyEP3A&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX-HMxxe&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBKIZN_7azTfaQi6efslMXdRRbyu03omzDG6VL92af06Q&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX-O6f_D&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB8_PPSPiQyKDvcNOFjOsV0sF70pK-sBzSEcV0e305ZBQ&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX-_6qpp&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCDHs4Onr01NqSGsLRBYWp3wqvsgmag7yuMKbSZgCOmwg&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX-pc9zu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCw_qAGhbVtg6l4XwUIZcuSAv2RITjUMl6CgL_pZE6nNg&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX83UihH&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBp0TvolYm5MYXMWoG939IZBLC0hPvqWhdzA_zMY_LRbA&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX87WJHx&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCMqtvcCb5Quz1ixVYnbiq8Wa1OMQVHT8LAatt1Hi6gmg&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX88J24q&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAj02aXribr3ocRt1jdsAAB6QA5gRXnI05AvJ9IhddisQ&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX8BDciO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCSwnoojthDRFhKVwpFeW4RybRwYzFrQJcaRqnlEOEOiA&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX8FCzc5&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCgpI3sbm8MjdBQKyietjPv23Uwy-5Ysatd0dL7bYGcog&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX8MEuE8&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBpWOtjvuyB76LPy7MNJYutnUSZS4vj42emxrp-BK3iDg&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX8Q7bw_&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBSmAUR-9SH8CWk_PHwVrV_Mobip0JYSmYqzD34FtjPeQ&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX8YJFT8&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAcCaC-3QD-v6LTcCejslyC8Dse19G3wNeVZWwL8SZFig&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX8o8ltJ&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDb9OB9y4tmuvqmZN0kcdozcstmVZGaNmEbt4UKh_s1Gw&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX92PhhO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAZL0-LxlPJpkhEIJmubMOkhT2acyNaCoTwVWpP5tjwcQ&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX99rVtu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDrmXBiFgvMgSbpz7Lk07hTH9IJ8Ss0_46d-l7ofHQpgw&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9ANBVm&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBoGrkWt2JbPeLE6m_zXdvZt6TPNdWsVAsLnFCXdIvggQ&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9FQ4DX&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBk3hTv2oftANhM1ewrTFaBEakRczTO7fpcqVI6HFcAMw&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9Fg-k6&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBUEvuUNOp3bS9jaDzAJN7-KX_h3xIEke0EwBKseL4KGQ&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9I--2_&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDjZkHkAHdrsikliTzXXlNd33PRRanjdR1GsXJgFYUlKA&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9PrQ7J&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAD7uVGtf6CN7UBV_EmZuXqv4Btao47uwY65Z8qmfJBCA&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9giRIW&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBX5pZq8ohz6la0TQXdXgF6sgrlhrLpdJ2J3krlN58Png&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9in62O&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCrDhUxO780PFjYIGyV_xdlhx5eEt1OmtkfDF_eFbpQ_g&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9k6t-8&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAMf8j0LB9giGosZOfCip1k8pTDZrQqynIFvAMpzurL5w&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9pFJiU&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfACWiByboJlYmNDVNkIun5q2x8tnD7gfTmBITROu-QIbg&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9zSF6c&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCX4AUZoulgHBwXyuw4qW5K4kgz6Y89dKp-Rpy978gqYQ&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_B5jES&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCxU0Np5kqthgWKmANqknwB5kBHzCcWm0Hu59qpnj_bxw&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_EqgrO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAefr_zz2uWm9nYNyML0RTQ1GNpx-Tso-j0aJCYiAUm9w&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_G2Qnr&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCCKCHBX_pADUoCmL-eurhVOkpdjkgANBzZxIPIInAPxQ&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_Lup-A&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD9l3wGpcI1IuGDiLTBwyzVokpsOdFjil0T8PRrDdPk0Q&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_YwRBu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAnUKPx0chDGMGda1A-7vmozD4iG8n9nzBveRVrHcbRrA&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_a5p__&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA0fc5iroDFfHEujMQER3gont-lY9hKWp1hSJCzYkDhgg&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_eSQMD&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAUTro_9NNQ0WyUHwxlhxw7c8LaskluPQqoEjXt134Vlg&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_qDVz1&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB2h6BMybhJBQ-lHsPYDJvC9d1TyivgEBVOM6P1aFpOng&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX_tWKtO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB1tcOaIeFg2SEt-dD1Rp7svXF_K29_fCukFVNCK9GsLw&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX-7qn36&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB3QQKuHn8RAYpsi8e8KN9bEEdn6wQ5r3f3QCzs1-YTRg&oe=6589CC4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX-FUIfK&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA15ePBH_uuL9JDnTZCoEp8SHx1vm2onDZisW0-3e-ojA&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX-N0Ghm&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfApDwrxPS2p7KcE9qHDfyf3aS0Vq8KwWDN2MqiRMZ6w1Q&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX-P1iot&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDqZgldYKOz3twDF4ABfsQ1f5ZyIYImzQT3bqKmO3Y2Gg&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX-zG2yy&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBUeOAZ6T3-xcCsLnuNCdIbe-2wZ-asrQqFOYjVhVrG1Q&oe=6585D7CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX836v-k&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAr-b7EuEOwYRGuvEshNCq_Bal0QahU1ckex7_jwPE3OQ&oe=6585D7CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX888eah&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDzoPxYWeM1ur2TQEjlFygwWR5hFv3i6p7z1-UAOzi1sQ&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX8HQCaj&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBo3xUWSj8FHjYlxlKmmf1AHAgQlHN-yCmSGSt-dF_GKA&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX8O-Aqu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCu2RwDgzZg2O2UQfmh09WNqAiBq820VNMMzaUnJQx6ow&oe=6589CC4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX8WiDmS&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDgubtwRbn5XsZCcyTlq_PcB23dSYOagcbtokQKxWu26g&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX8qDLku&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAqKgjHg6_f31rySK3tbX44HE03Tjk33iTe6sjbyrLA5w&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX92NFGl&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCJMRWPGPe5pmPm5wR2H6t4HX0E6Sg-4SQAjvsVdMXfjw&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX9IOgHA&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB8OpLFdhs12VJKe0V-6vLDhrTGeVsy0fxNkcKgFPwj0Q&oe=6585D7CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX9TlBRe&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAggvWvMIfh1EnSNOtYNcvriqM1UkdKJX-ADPL0gcsQ4g&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX9X4bj0&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBHoGslAK15hTYk6YzBs5ebN5pBRc2U7t_p8z6q8y0Q5g&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX9vo7tG&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDQyIWVJh0lZFEgf6SO4MVWDK-c9sFzBfmFNyahzVFVug&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX_ApvkS&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA-Im444IuKQeoAtgqFglROrsCF7pwAU6TGKekQRNdJag&oe=6585D7CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX_YBqdr&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCu2T54v4TVmOI5iE3LLfT3Zuo1GxjaBVxT-ZqXL7qTKA&oe=6589CC4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX_giikh&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA49a302X51m6tizzCA-xQouZbeUCxD3k0F0iHE3Ja4Pw&oe=6589CC4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX_nK053&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAqViRigkaXbhkVeKqSC6ylrg1mvq0tKWSfxkUyfCzEeA&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-3G7Ep&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDcTY0ool2j7ITig38izitgBnrgMnK7N_b1r4WI3mFdSw&oe=6589CC4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-5tJxn&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBDmeskJaAU2Xpi5TH1taVgFlWpxPQCjQphAS7z7ReBbw&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-7H3Th&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBSnvY163ACS7TXDaNS1gbiEOfrLApAL3aVHvV1nyqdsA&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-9UvcM&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBpRT1T6b8tY9L084_y75r7aM6kj8F7ISl6T8NFpd6dCw&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-ACysV&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAwTN7ic3OoDk7HtXGPwICI7-7LFCQQtBphb2v5WxBPTQ&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-Bphbu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBiiBZn69PqmY-LqUYlq-l_7uEGOV1w1bBp8tS-g11MWg&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-E7lZc&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDpkiGQCP5OOnfkzA0yCOqd6wTtqfmjkpf6447pJL4ZrA&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-FV2tD&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBuLwgenH40PhGn6qvbi18MgXh8ykTFv1u-JblfJ7afmw&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-M0mtV&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDu9uG-evrWMB_NMCebtafeWnvM2O7V0rncr7CXHaOMKA&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-Nuc2i&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfByvDUGs98AA3VRf9q9dAqkW0bDKIqXEEXXhffgSWMZgg&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-SOa0W&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfClLGCO9WtW364_4aUp_pL7Ty5cgar6iXo8HtGpYV-JkA&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-dfXn1&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDlsD9LNCeAA0zbXiOxc5_0WrhbjTiQ400IzkKXdp_2XQ&oe=6589CC4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX-x3Eak&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDvi-sIDxTZhbyq-bbbiLin5xSUgUnjRDHHHResE8p9xg&oe=6589CC4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX834yOE&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBwbTRqMlGHVohRVmAWhlasl3HaYTztFKbseP5hPfqRsw&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX88ZfrN&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAeLqJ9leL0sxHG_UZmCG0ztFI6XqS5Sygf3-zspFJb8A&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX8hNE2J&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBlaapfKTpbRPcOY2uddCctdn3rqQEHpTUiYSjfhX-fsQ&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX8ijCkE&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAnLPWaR452tI9nPMPsU6frCttwrBccdgAf-4l6gOJYQA&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX8wfDzR&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB7we2vKaZpzZmjoXlnYXvxpHJ1awFCzk3xQbBZm1bDHA&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX9F2Syh&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDbdtxFuc-8dbXY0lEg_z_02_U4R6XJcJWF0eYlQfEvWw&oe=6589CC4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX9JnO2B&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAgmUmK1lyWRYAkYcUJU3JgHJZFTUN2RsCzPoSw8SHD0g&oe=6589CC4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX9LFixi&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD9yfI2a7b25yvLmCzz9HrP1-rMPQGPwagDYLT28it7Og&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX9Mo1I6&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDQmjuzt6WPV9SA5V66PDglSd4KnoVd_tYnfO-YBh80rQ&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX9PD7qG&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC4aJllUfHQbuYdzdeXeK_956Aw8HxFf9fJI4Tx2sv7gg&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX9U9oxm&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC9Y11abmQn_EyjDBl7vzSUjU8RKWcZmlC0Xrl24gZzvQ&oe=6589CC4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX9cNyKO&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAwdKsYVNzeIeOEh7U5yMvQZt7d-4fKyPnPsywGJ7afgg&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX9yrlPH&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDYvzskJwHX6DbWMKBRT2o0bRwAdYDtp4i1X5lgJ0AN8g&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX_0IJwy&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCV6JfWMtQVvMouYh6cZzcvTDkfaWs0aE3v4h1W1E5z1Q&oe=6589CC4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX_4VXik&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBEaez2nN71PEI50d6s1yrk6GPMdOHAPvbp6x9GcmhULg&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX_763lM&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC72_wLZsxsw1W6eNY4PKN5uXwJBCvw0JCMvBcRuiiWiA&oe=6589CC4B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX_D8idt&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfApulXgy31gDX1Bg9fvDhSbHQu7JF63qylvAcmDkG5Mjw&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX_VNEbU&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBXJvHT2ECDzYWFWvzylqeFCe8oUA1XPIY_yy48e70s7w&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX_YKk6m&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD0-lmbVFPwHOuTk_iCyJ3lEFSt22CQAhNF3Yit52uYpA&oe=658DC0CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=HcM54he3vxQAX_fXunk&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBzsPd-gj6A6mGcQEX42vBxuCuht-0GK0wzz0ozU10XDg&oe=658BC68B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX-S36Ot&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBmNkqcfkEDuKQAIEq37O3ZA4x1-f8LVQx7uR6A6ms_KQ&oe=6572114B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX-ZRBH8&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCBXzYih6zw1qav537NagRiU6nFjNM4AlMnEVtFZ0eUGQ&oe=656E1CCB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX-ppCyb&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDrkXTBE6K45t4m6bxa2_qcmcrHdX1-nzcpVAatd9bxbA&oe=6570170B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX82pa0S&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBrxH-1ybVZtS2F58r1y-p_mVLnHndBXnjMaAIMltncmA&oe=6570170B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX8eGjIv&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDZSVeas1h_FKb-zaYVGoYzaymgqfl4nAidzwvPyuulBw&oe=6570170B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX8qU1ne&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBRHKuex9eOFoNVKyljfGxS7xsPDCFpqhuqCeksnOM0nA&oe=656E1CCB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX_KMujA&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBHvPidoaHZF9nwtR5gjCvP_-RDVtvU6aKM55gmLSdiwQ&oe=6570170B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX_sjxih&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAbXH0M5K0Ur_cRx4mU3P2J3JWfMH95yKHgfP2w-WRj_g&oe=6570170B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-9ecJ6&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAk2i5aFQiPuX3RutM-9dVQm0-hrjrX6k3bg2AIU2GMRw&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-JOBbL&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB47nE1DUlJ4ztPDcVol692ej-Uolxk5uv-_O4KG3RHvQ&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-JwAZr&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB5y0ys8EPkKSRnh5dLbmMmRaZDTwyupW6sTGYjj7t9ug&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-MXruj&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDrVoIwqnh4Nu_CYbjofLaJCiIhrjZ9wOb_ukiBycs6Sw&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-Q7Iu8&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDSZsyg2kCggU0DejBpQwqYt5b2odSLrENpYBScruSySA&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-_pnql&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDM2PDML87nxd2PTNVuiR-iWCvi2MmZEtjHrzWsK7DbUg&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-lDhNi&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDJvo3vjdC68A7zT8ZkrG-f0L48SQScjq-vFs44JK3nKw&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-qO5AG&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCT0GwP6Xwe6wb6cRbRsgrVlkBEW1rKm2qf4Q00D1Yshw&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX-vNVm5&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDYg7rfdXASK3FLpMO3qzE9vvILheKV2vN_RrEYnqk4_Q&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX81_Y_a&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBdwnnOuIDc-EgpRYtsw5xQPVuBJsG51Mlww5it1NRjGg&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX81t1ne&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAOhsZvK2ZdTWh6JU6Phv2T9BHQnbI1_2gMDCfUWp9jMw&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX87FQdN&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCMWX1o2pPTfQnt2Kn3kVJ7uOqOcQqZoVmVOJyqSmjJKg&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8OYZ7K&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAbC93HI8X6TZI6qAVMFCIM2bkM9OTe6Mw5lJy1vk-UYw&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8Pmchb&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD4phAAmpErSoWLa7PC11fj2LG3IQsrbdmXViOc4UCkLw&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8Qz0hW&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD7JpiBXGlYfWn6AnDkaaL1PSuYyoH4EQyxF4_GcBWjng&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8Vmkgd&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAHlhtaMvDrOfpLDJhX56PLJ4AWhDpFobD72RD_S9iebQ&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8YkENK&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCCRdrCjQ9_wsUIdRuv4G3B8HmxNGAAJVUG1L-CtJURgQ&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8awGG6&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBsjxcyHdQqpBZEwYP7SkXpKW0xlQ0gVAuzglRd5nh9cw&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8b2MpI&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBuG0qqdg9f_roz8wYegNk-Y4HXFmT0FB_lGVkHuoqMGg&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8cWYWG&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDDaZ4UG1kPZ5BXe3cdzLp63mtlV_FendMCD7Zsy3m0Xw&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8f4QNu&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCOXyMwGSEpU-ye34cSRVUh2iQUt3FWpnC7_HiZbBp5sA&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8gJC0L&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDaHGE_rwW1nrbldF5xrrdMrM5roYImYjhMAQlYgfnmaQ&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8nE7Mw&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB9sqAlMNaJHlPAxFRhHegC3UPkq4gV_ItEUqkzncVm2Q&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8njQgd&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBwKBSCBV4t8abc5WqNtpF7BsB87dW89n2MqUTT31J3sA&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8oqK3n&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAHCtf0MtXgf59LJvqhRnmzRymxaagpBd9_zOKSdMdcPA&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8rNTsZ&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAELTbNiQr9kGqVvLf9oCLLPWv9LouuxqkBAB2Ix_-ZoA&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8twukE&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBaw7LHrlVaXmNDqwgT9owgx80pQM6O9BrWwmR9OG7pFQ&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX8zykWB&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAjtxbc2uODW4eAB0-HkfK86D7efYcmEpE6yjZ70EDCsQ&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX90L-AV&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDtFDmO9iglajz_uO6aYTRc2WYnXXgniG2nO1HXB0-Npg&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX95aohm&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDxpqzKbx6tkfm8ycCpZqRtl268WfGtp477SA8jV3z5ng&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9Fn52f&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBeAlQVyTpVSNis36BbqwWcUCuRgenC-DCj5A_HL7_tjQ&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9G60c5&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD68qy345Si8lIkbGddkPu144Lv5VVQnd_5JYE1i8JI0g&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9Lg7FM&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD6H5jffCsK-vdnoa8eL3uRD57He5CJ8AKOEkps_uOY_w&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9O8yBs&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD6PhqWYHsTJUAv_elaLfYmdHMKAvabv07eannjhqUANg&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9SXqkY&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBTccsuurQ6HeXlJSwGB0hnTMmFVaTF7amQrzrYTCm-Jw&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9T-QUD&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDwiQpp4d07b1Pbg0FXEKhihzmBDJ-IsxKM2zMd0qTWVA&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9ZtzhF&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC6yeLTDYlFSslTmcbs-qWF10ESV1yQVjzhEdhXG2BzdA&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9_4MPd&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDE3af1LzZMNfyuX6aosRdZ9mE7-12-DCzEMeVyO7VteQ&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9_a5ON&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCvHxVq-TcPNm2M63-isvc9cwjL7VTMHgzhtfm6wX7_aQ&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9gwXgE&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDjaJJici_jLamEDSEyUw9xL_oDShQl1p94fT2yRZoHNg&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX9xn9zg&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCDmpJ1VAQXAQHPEfzxIgsR5ux2WxYdQW56dtdHhVYxcw&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_3Qn0q&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCEnwe9xZVyqHaY5OtkU8TeOI-qcNxxVZH9dC8_J8hVDA&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_43NXH&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDmRKi8dWkADIGzS2Oe_lPUqYIcNfmVHlL5YwZBmgpJFw&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_EOBTM&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBsvvQa7Py_Ornuh2HWR43VwQbtlgs3BWKmNgDjFfxmBA&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_FGSao&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD89Fusfs2SXN9UhTCpM_eWUYkwMI2i2cbbPPHjjx_Abw&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_Hxk3L&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBtCTqYO3dAvZyp7n61t8cr-k5MxgMz4EzHdSwQKQeFtA&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_IV8Sg&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBSz6bl98eNPBs8V95wHt6YN1plSo7cNaad9pMm_R0q2A&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_McMrm&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCsS_AeT-zIfInzTALijQuoqEJKXPHgySiAfOHI94fRYQ&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_WSFxy&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAv5oeF86RVgaHPo-U8BQnZMeZY9iMlUnc02bm1W2MsdQ&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_d-vyA&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBDsRfEBVKBEJRPhAcTMa0Fph33g9YYNOznO9PpsadIew&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_gzNj_&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB8c7jqJA-oW4LGgc8bz8DbFzK2ig9l060iStg0H3bD_w&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_rhvH-&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBS-0WA86FS6HKw5szVMu44czCw4VO7ZaPduAVsQ1xqVQ&oe=6595A9CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_u1dfa&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCF6EcP52c9PYh-yLAbg51arhG8VYwctgkwiVWEKuKYng&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_yFc43&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBJ-n7a-RnyEqhqH1HpL3RIctfRVgFlpD27FfoM0PyWzA&oe=6593AF8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=PqWI9RL7mkUAX_yN1Rh&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBNsRLL5H1DSZnFHh4nXPhqHOszqylCy6T1JmiSlZG01w&oe=6591B54B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX83ry-x&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBe7PIkVCeWwRKyd2HSCn3TdDu5z0Hy9i1jv6U7i2xLqA&oe=6572114B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX8WPRzV&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAdiKxSrsk0ynWekXsxM1fPUtxTCAaMQzGCKGNyxBMj7g&oe=657605CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX8izISk&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAp3aKJeqkWZpVcbSeKbK9b6vMaSPtkNNLYp1hMpPQJgg&oe=65740B8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=QCtoH0APMz4AX8oU1Xc&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBJFne2MeG65tPydk-9bw9oe5X-41_oGlN2hcY0c8UUFw&oe=6572114B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX-28FNs&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDII5Ecf0V6BAEmZf2q3HAf9_1yEPDAWJCkyEOZxZvMFw&oe=6581E34B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX-Htnbq&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC3uQjDsQTH4YjD4sYzVoyyw0N9vFzi9-00geGZ5VryPg&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX-UoA7a&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBF8zUJXSf_JJgVF0nXQrl96mdTzSEnWTPZIprQrMK4Zg&oe=6581E34B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX-dFTVB&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAQKs8GHTKUuUEXvrZV36064xWYPKkBT9iUQ99TDOlwxA&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX-q4SmT&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAytXG3oCRLgKsaLwi5zHA6a7PiT7uKh4cBlFY-u7N0LA&oe=6585D7CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX88q0NA&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCObbz_E2eZV-RFYuepBcv-yRW9ig7y23RQesOINh-l8g&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX8aaq9d&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBlTal-F_akoHulr1eScwKB3BKp69iF_3jCYXHmEaB4Gw&oe=6581E34B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX9BOwC0&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAS6BTZsMlSLU8MK2i9KeoCFbjMDsKoGShG4mqubO-Pjg&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX9PWBgr&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBXwQF45qS0B8Kra5MVXklvLTDV3BB9elaFW9OC2k3Xfg&oe=6585D7CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX9XlV-o&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAkZqbUPxK6J6s1-E7IzejM3XIFNE_dwha4slw9Ky8vgw&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX9clVF5&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAM76O8bkZLVhEGAVAoVe-aQB99ywpIFgSFhVtn25lN7A&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX9uuz97&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBtvZimdeY7acW4v3LFL1XkDNCoRm1nX9y1IhmiCjaxBw&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX9xLHsG&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCXH2t5fmucXoggSJG7Jmkf-2TU5crrq-_S8xF3k9ae_w&oe=6585D7CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX_MW9FW&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCM_YnymnStjbSYJvHqVe6MhT-meVd35gqLHt7hAaydvw&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX_N8rVB&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCHdXus5ft68lbzpskvMNAcv1kJdevGuzbzPlXl_BY50A&oe=6583DD8B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=XYVkOs6KqM8AX_YUnKl&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD9XjIQK_C8ZxH1EDPKq_B3ricZop1tWqNGPJSXSPN62w&oe=6581E34B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX-ZUdTe&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA3ApAsG-abuovVr7uNPNZsVXbghxdsx_DFDkKmAvKJEQ&oe=656C228B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX-bAPG5&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDyIt3cX1ryhJADhHRrI4wvcSX94KcWOeM4virIqSjhVQ&oe=656C228B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX85J3w7&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAmhpk4F-Iz1dDL7IXwIpXcA50LKnnto0esWFuKSTLmoA&oe=656C228B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX8cZVWH&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBKK501l8viDWsoY14FOGJqEA9lXW4SGWNghl_drBpnUw&oe=656C228B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX9WMfD0&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDBQrUTzNCiV_iST0asIJrOe6D2bE-RcQ3ao4vszrBvQQ&oe=656C228B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX9YiLwJ&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfA-wPmyLjcBjx2YddbrtvXqlKEd9qfyWyxSWqzfwhtqsQ&oe=656C228B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX_L2FN7&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBzHPB0alhGAnabwwxxRjNHlHbtORK0J-5peMHYnrmWMQ&oe=656C228B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=e3zYnwMauN4AX_eLyzE&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAQTSuDoTqXV0pLxvgPd-T77AXrNStfgG86Qa5IVxpEjw&oe=656C228B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX-ZK6yP&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB0oWGKlu63LG-eNC4M2gxdi5S7ef4Q0GiH4wBzqY0rLw&oe=6578000B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX-uvYjf&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDWzk_53QiegWoLXRG-sGrOfTea_adPXxBJ3tPHhXOJ2g&oe=6578000B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX85t7cr&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCXqBrB-mrRHJ2fALtwRUsbvQ85hyO_rJpNy0VLjsxaMA&oe=657605CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX9DaubB&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCassy35t3mCw-5jPxApu07l19YZp1ufsUHkItKXmgafA&oe=6578000B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX9JWzTl&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC8vjjWsKi076FoVygD2RlttAKdmWtOL8aWOs-znMWIag&oe=6578000B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX_JE5yP&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDYm7ExCRJDhwaRx0wQzwY_6T54Cl-XrkB6eiy4akH9VQ&oe=6578000B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=iKzZaLiAtE8AX_lUSlg&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC6kZC6kBxIsALO6brVotBcyvmnNTuWbC7Xsvdd1uaPRA&oe=657605CB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX-BCc5J&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCQznjxAjniWsrAImnlJWZYG_HOOsRzEUFmk3Bir4pAhg&oe=657FE90B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX-Db2kp&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCW1eWPgZRyKup8XXiB6vWarDUX7lMDIh9ZNGKT1qatxQ&oe=657DEECB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX-RUw1W&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC5yQOrciiP9874039YbmKF40aUAVTtZ3R-zEHAiioHaQ&oe=6581E34B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX819vRP&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAV794ZOT5jobdQg6xkqxMP6ykjre4uOI14BM0v8Ces4Q&oe=657FE90B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX8DIXet&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAQVeKjyAABnWqqw5VrkAWxf59kXQo-5LLiu5Glf60W2A&oe=657DEECB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX8XssO2&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfD8SDdN-ImjgLD3IV9_W0Jps4XLA6ruhNMYLAKg5d-BCg&oe=657DEECB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX8q0t0-&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCd_HKGtFZLR6TyVp6owqQptm2eN7RGOFWq-buYO-nbSQ&oe=657FE90B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=otiL0d2-CmQAX98Dyf2&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCeR3H-nCdrKIRxaWBlJZk9Bnca7Jf6QIO70mBjdHrHTA&oe=6581E34B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=101&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=AFb1pAgbMJwAX9G0E88&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBg2CN38AoYFFbdeVnk5VNojBDcqVUhx3SnAZ1v2ntb2w&oe=6597A40B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/403615351_1326608544887604_5330439749044484231_n.webp?stp=dst-png_p100x100&_nc_cat=103&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=Si_-U0oJ-egAX-N77d0&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCUhbGORLSPcuazf-Vt_v7cgV5Cy5RkHRKVFEBm9y1PQQ&oe=658228D2 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/851582_369239386556143_1497813874_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=BUhhIotgnaYAX89X8K-&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC1Y2jzrUSiLvP53X-5rizE3X2KEwS1nxNE9LjIBsLwbQ&oe=657FF351 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/851582_369239386556143_1497813874_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=DeS7mT0tEnoAX_6v3IQ&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfChgMx02tktiBserA4l6Cv9qoFPnW6kNJTlAmGuAcN3rQ&oe=65761011 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=-XyjQRvOqdIAX8GiwfN&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB3t-BpA0IiUb3j1Asl56GUruz6KxzqMYrNUYrHubYilw&oe=65775646 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=4BYwTPs5EB8AX8DhkBG&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfC5BLq685Nfavl9oiMW6Q5dK-GjEHNURGK5QcOatZ_4nA&oe=65950006 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=4BYwTPs5EB8AX8d5L4S&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCaAMqrB3A6cewpGQfUU3KkowfN3qsborrRh_RmSXIF-A&oe=65950006 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=4BYwTPs5EB8AX905_9b&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBXLTO9VkiAd86E-ZujHBMUuHGyt9BvaCOFRgR0EQXCtA&oe=659305C6 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=4BYwTPs5EB8AX96yC1Z&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBLYH_JJwM91QVysssMI7FkCGUiSZjHwYlVyF0PT5cPtg&oe=659305C6 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=CB05twjV2fkAX_W45oN&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfAehq1_PdUHKeNcA9E1wPZRMyBWuiCg-k3_mZ5k12CovA&oe=657F3F46 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/851587_369239346556147_162929011_n.png?stp=dst-png_p100x100&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=vEsrwnJOCUoAX_Og2iG&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfBMJLszBtfwXKmRwH8r9yCkI0yf37YsLlQydu9ME8QrzA&oe=658D1706 1
i have to wait at least 18 hours 1
i like it 2
i like it but i wood like to see cleeaanner rivers trash oof the banks rd side bridges where trash is under them 1
i love it 1
i love it i just dont have funds now i am on ssi but tell me about how much of a donation plus inthe future i would love to volunteer at a shelter near me. 1
i prefer a local charity 1
i used teach a groups that did what that charity suggested 1
i was very pleased with how it went 1
i will think about it 1
i wish i could donate right now 1
i would like charities that i can work for … not just with monetary donations 1
i’ve started donating monthly. that means–good choice!!!! 1
interesting 4
interesting. I donate to a dozen charities already. I know about SPLC but hadn’t considered them as a recipient . 1
interesting…I am particularly interested in a charity to help girls’ education in India, a country where I grew decades ago. I’ll check to see if Room To Read has work there. 1
isn’t ok. 1
it great 1
it is a good match, but I prefer supporting very local groups. eg: instead of planned parenthood of upper New England, I prefer Reproductive Freedom Fund of New Hampshire 1
it is a good match. 1
it looks good, but I wish I could find something more local 1
it looks great 1
it seems to fit 1
it was a fun survey and it has me looking into the ASPCA as a possible place to donate to 1
it was a good chatbot 1
it was easy 1
it was good, I’ve never heard of them 1
it was good. Thank tou 1
it was great 1
it was interesting 1
it was nice - but a bit too many questions for my attention span 1
it was ok, but I was really looking for something along the lines of K9s for veterans 1
it was ok, but I’m more interested in keeping people who have a house or apartment from becoming homeless 1
it was ok, but would prefer a charity whose work is closer to home 1
it’s cool! will lok into it 1
it’s ok 1
its a good one. 1
its good to know things 1
its great 1
its not to bad i guess 1
its ok 2
its ok need more research 1
its pretty good 1
itwas fine but I don’t have extra money 1
later at work got to finish my work before 10pm. thank you 1
leven me alone 1
look your things make me bored change the topic 1
looks like a scam to get more money for S Olympics. your survey gave me no options to donate to the charities I support. Gary Shinies, Stop soldiers Suicide, ASPCA and KIVA all 4 of which I donate to every month. where was any veteran mention? where 1
love it 1
love it thank-you 1
loved it 1
medium, I wish I could’ve chosen hunger and homelessness 1
meh 1
my answer would be no cause talking to a bot is not trust worthy for helping people time wasting. 1
nice 2
nice job 1
no 4
no more chars 1
nope 1
nope not now 1
not bad 1
not enough info provided on the charity - just the name and the navigator rating. 1
not good 1
not good at all 1
not good match – i prefer more specificallly targetted charities 1
not good. I am looking for a volunteer opportunity rather that another place asking for donations of money 1
not great 3
not helpful 1
not local. I am interested in charities that serve my community 1
not much 1
not so great. I wish you could go back and learn about others. I can’t choose one thing I am interested in and then like have no other interests. Si nce I chose familiar, I learned nothing, 1
not unexpected 1
not what I wanted 1
nothing at that link - received a warning from my security software 1
nothing. 1
ok 10
ok but I am not changing from my core charities. I will do some research on your suggestion. 1
ok it alignen with one of mine 1
ok, but I prefer to support local charities 1
ok, but should allow for more than one choice in the questions. 1
ok, now leave me alone 1
okay 2
on the mark 1
only interested in Israel now 1
perfect 3
perfect… 1
positive. I already donate to World Central Kitchen. 1
pretty close 1
pretty good I am still ready their website 1
pretty good match. but I have never surfed. that is ok. 1
pretty good! 1
really i don’t know 1
right up my alley! 1
so so 1
so so. You left out victims of war 1
sorry i just dont trust you 1
sounds perfect. 1
stop 9
stop. 1
t that’s the truth. 1
useful tool 1
very accurate 1
very good 2
very good would say it is my second favorite 1
very helpful and easy to use 1
very well matched 1
was fine 1
when i tapped the link you sent it was NOT SECURE. so i just went to its .org website and donated. Never had heard of it before and i donate to lots of orgs. 1
workable tell me what you have on Lions Clubs Internationall 1
would prefer some place local 1
you couldn’t understand that I I object to being given SPLC. It takes more than a few years to change bad leadership. Their Board allowed bad leadership. 1
you didn’t give me a match 1
you hit it on the nose. I spend more time and money on trying to get groceries into homes. 1
1
1
⭐️⭐️⭐️⭐️⭐️ 1
𝕀’𝕞 𝕟𝕠𝕥 𝕘𝕠𝕚𝕟𝕘 𝕥𝕠 𝕓𝕖 𝕒𝕓𝕝𝕖 𝕥𝕠 𝕘𝕖𝕥 𝕚𝕥 1
🐶 1
👆🏻🖕🏻👎🏻 1
👍 2
👍🏻 1
👍🏼 2
👎 1
😊 3
😎 1
😠 2
🤨 1
🤷‍♀️ 1
  • Upon checking the responses, we noticed a few links in the feedback. We will create a binary variable feedback_has_link to indicate if the feedback contains a hyperlink. We will also create a coded version of this variable, named feedback_match_coded.
data$feedback_match_coded <- data$feedback_match

data$feedback_has_link <- ifelse(str_detect(data$feedback_match_coded, "http"), 1, 0)

Share with friends

  • After providing the feedback, participants were asked this question: “Would you like a link to share with your friends so they can do the charity soulmate quiz too?” The variable share_link_with_friends records the responses to this question. Participants could choose Sure! or No thanks. We will now check the responses for this variable.
data %>% count(share_link_with_friends) %>% kable("html", col.names=(c("Share Link with Friends", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Share Link with Friends Count
43808
*was 1
But thanks for trying. 1
It is to long 1
Later, sure! 1
NO 2
NO BUTTONS TO PRESS ! 1
No 4
No thanks 2092
No thanks. 1
No, not now 1
No, thank you. 1
No.. you didn’t respond to my comment… why make someone choose a US or international charity as step 1? 1
Please stop messaging me 1
Sure 8
Sure! 467
https://cdn.fbsbx.com/v/t59.3654-21/408052579_2338762712973480_5696718400858605391_n.mp4/audioclip-1701843030000-3994.mp4?_nc_cat=102&ccb=1-7&_nc_sid=d61c36&_nc_ohc=5F1ef-MNNuwAX8ldwRm&_nc_ht=cdn.fbsbx.com&oh=03_AdSSLW4pOB7h5eJMb0ziwQPGuyTU3B4AUYH9DeecfZaysw&oe=6571BC58 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=10ocfyJW730AX9hYzaA&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCT9L61lIJLq7blWUtctSCFj5pnfphKQMqI1p3fepHUPA&oe=657DEECB 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=B6irotxGcYoAX-baTGg&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfCAwIhJZOSFyCKGDbFak8oFBFPjpIwygkFgBrtq2TICaA&oe=6587D20B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX-ppCyb&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfDrkXTBE6K45t4m6bxa2_qcmcrHdX1-nzcpVAatd9bxbA&oe=6570170B 1
https://scontent.xx.fbcdn.net/v/t39.1997-6/39178562_1505197616293642_5411344281094848512_n.png?stp=cp0_dst-png&_nc_cat=1&ccb=1-7&_nc_sid=fc3f23&_nc_ohc=L8Be8L4AcpUAX8pDFUN&_nc_ad=z-m&_nc_cid=0&_nc_ht=scontent.xx&oh=00_AfB8nsLxg8mtM5o7oBdebz7C1_9AwmFjVdnYv9a9HPKf3Q&oe=6570170B 1
no thanks 1
please answer my questionn 1
send me airtime 1
🖕 1
  • We noticed responses other than the preset choices. We now create variable share_with_friend_coded to indicate if the participant would like to share the link with friends. The variable is coded as follows:

  • share_with_friend_coded == Yes for Sure!

  • share_with_friend_coded == No for No thanks

data <- data %>% mutate(share_with_friend_coded = case_when(
    share_link_with_friends == "Sure!" ~ "Yes",
    share_link_with_friends == "No thanks" ~ "No",
    TRUE ~ NA_character_
))

data %>% count(share_with_friend_coded) %>% kable("html", col.names=(c("Share Link with Friends", "Count"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Share Link with Friends Count
No 2092
Yes 467
NA 43841

Append the manually cleaned dataset of participants who chose to redo that charity matching quiz

  • In the earlier section of this notebook, we exported the analytic_id of participants who decided to retry the charity matching quiz. We went to Chatfuel to manually record the responses of the first set of responses of participants.

  • As of 04/03/2024 we collected the charity matching quiz responses and donor type, but we have not yet collected the donation intention and feedback responses of the first set responses. This is a work in progress.

  • In this section, we append the manually cleaned dataset of participants who decided to retry the charity matching quiz to the main dataset.

  • The table below displays the first set of responses of participants who decided to retry the charity matching quiz.

retry_data <- read_csv("./Data/Processed/fb_charitable_repeat_record.csv") %>% select(analytic_id, consent_coded_num, repeat_quiz_coded, country_charity_coded, main_cause_coded, sub_cause_coded, charity_name,    donor_type_coded) 

retry_data %>% kable("html", col.names=(c("Analytic ID", "Consent", "Retried the Charity Matching Quiz", "Charity Origin", "Main Cause", "Sub Cause", "Revealed Charity Name", "Donor Type"))) %>%
  kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>% scroll_box(width = "100%", height = "500px")
Analytic ID Consent Retried the Charity Matching Quiz Charity Origin Main Cause Sub Cause Revealed Charity Name Donor Type
5816_2023-12-07 16:23:16_2023-12-07 16:23:16 1 TRUE US Transform education provide tutoring and support to underserved children Rocketship Education smart
6411_2023-12-08 13:02:00_2023-12-08 13:02:00 1 TRUE Global Eradicate poverty worldwide the skills to grow food sustainably BRAC forward_looking
12008_2023-12-15 16:56:44_2023-12-15 16:56:44 1 TRUE Global Defend the oppressed and marginalized groups targeted by their government Amnesty International smart
12202_2023-12-15 21:40:24_2023-12-15 21:40:24 1 TRUE US Heal the sick rare diseases that need more research The Leukemia & Lymphoma Society smart
12871_2023-12-16 17:50:45_2023-12-16 17:50:45 1 TRUE US Protect the animals animals in factory farms Mercy For Animals forward_looking
14048_2023-12-17 23:39:44_2023-12-17 23:39:44 1 TRUE US Eradicate hunger and homelessness employment training and opportunities Year Up responsive
14692_2023-12-18 18:12:58_2023-12-18 18:12:58 1 TRUE Global Heal the sick protecting against preventable childhood diseases Evidence Action Inc.  smart
15691_2023-12-19 20:27:16_2023-12-19 20:27:16 1 TRUE Global Protect the animals any species on the brink of extinction Wildlife SOS forward_looking
22625_2023-12-25 03:14:11_2023-12-25 03:14:11 1 TRUE US Eradicate hunger and homelessness employment training and opportunities Year Up smart
27878_2023-12-27 16:02:57_2023-12-27 16:02:57 1 TRUE US Transform education send a low income student to college Thurgood Marshall College Fund smart
29705_2023-12-28 18:22:15_2023-12-28 18:22:15 1 TRUE Global Defend the oppressed and marginalized people that are victims of human trafficking Freedom Network forward_looking
32858_2023-12-30 04:01:37_2023-12-30 04:01:37 1 TRUE US Eradicate hunger and homelessness people with disabilities Special Olympics responsive
33329_2023-12-30 11:47:31_2023-12-30 11:47:31 1 TRUE US Defend the oppressed and marginalized women National Women’s Law Center forward_looking
33658_2023-12-30 15:02:28_2023-12-30 15:02:28 1 TRUE Global Eradicate poverty worldwide access to clean water WaterAid smart
33731_2023-12-30 15:30:48_2023-12-30 15:30:48 1 TRUE Global Protect the animals any species on the brink of extinction Wildlife SOS responsive
36996_2023-12-28 05:24:41_2023-12-31 19:54:21 1 TRUE US Transform education provide tutoring and support to underserved children Rocketship Education responsive
41772_2023-12-21 07:14:28_NA 1 TRUE US Eradicate hunger and homelessness a roof over their head Housing Matters forward_looking
n_repeater <- as.character(nrow(retry_data))
  • We will now add 17 participants who chose to redo the charity matching quiz to the main dataset.
before_append <- as.character(nrow(data))

data <- rbind(data, retry_data, fill=TRUE)
after_append <- as.character(nrow(data))
  • Before appending, we have 46400 participants in the dataset. After appending the participants who decided to retry the charity matching quiz, we have 46417 participants in the dataset.

Replace empty values with NA

  • When we manually recorded the entries for charity matching quiz repeaters, empty text “” is confused with NA values, so we will record all empty text string as NA values.
replace_empty_with_NA_multiple <- function(data, column_names) {
  # Check if all column names exist in the dataframe
  missing_columns <- setdiff(column_names, names(data))
  if (length(missing_columns) > 0) {
    stop(paste("The following specified columns do not exist in the dataframe:", paste(missing_columns, collapse=", ")))
  }
  
  # Replace empty strings with NA in the specified columns
  for (column_name in column_names) {
    data[[column_name]][data[[column_name]] == ""] <- NA
  }
  
  return(data)
}
column_names <- c("consent_coded_num", "repeat_quiz_coded", "country_charity_coded",
                  "main_cause_coded", "sub_cause_coded", "donor_type_coded", "arm_coded")

data <- replace_empty_with_NA_multiple(data, column_names)

Creating clean dataset

  • Variables continue to be updated as we clean the dataset. We will create a clean dataset with the following variables:

  • analytic_id : unique identifier for each participant

  • source_coded : equal to 1 if entered via JSON Ad, 0 otherwise

  • repeat_quiz_coded : binary flag for whether the participant repeated the charity matching quiz

  • greeting_coded : binary flag for whether the participant passed the greeting stage

  • pre_consent_coded : binary flag for whether the participant passed the pre-consent stage

  • consent_coded : binary flag for whether the participant gave consent to the study

  • not_affil_coded : binary flag for whether the participant passed the not affiliated stage

  • country_charity_coded : country of charity (US or Global) selected by the participant

  • main_cause_coded : main cause of charity selected by the participant

  • sub_cause_coded : sub cause selected by the participant

  • charity_name_coded : charity name revealed to the participant

  • has_logo_coded : binary flag for whether the charity has a logo

  • donor_type_coded : donor type assigned to the participant

  • arm_coded : treatment assignment of the participant

  • charitable_intro_start_time : time stamp when participant entered the chatbot

  • charitable_intro_end : time stamp after participant saw the statement “Awesome! Let’s find your charity soulmate”

  • charitable_match_start : time stamp when participants began the charity matching quiz

  • charitable_match_end : time stamp when participants finished providing their responses for the charity matching quiz

  • charitable_affirm_start : time stamp when participants started answering the affirmation questions

  • charitable_affirm_end : time stamp when participants finished answering the affirmation questions

  • charitable_reveal_start_time : time stamp when participants started seeing the charity reveal

  • charitable_reveal_end : time stamp at the end of charity reveal

  • charitable_treatment_start : time stamp when participants got assigned a treatment group

  • charitable_treatment_end : time stamp at the end of the intervention

  • time_since_first_start: time started the chatbot since the experiment began in days

  • time_since_consent: time conseted since the experiment began in days

  • time_since_match_start: time started the charity matching quiz since the experiment began in days

  • time_since_intervention: time started the intervention since the experiment began in days

  • duration_intro : duration of the introduction stage in minutes

  • duration_match : duration of the charity matching quiz in minutes

  • duration_affirm : duration of the affirmation questions in minutes

  • duration_reveal : duration of the charity reveal in minutes

  • duration_treatment : duration of the intervention in minutes

  • proper_order : flag for participants who have a time sequence that is in the correct order

  • treatment_text : free text responses from participants in the opportunity and obligation arm

  • text_has_link : binary variable to indicate if the response contains a hyperlink

  • manipulation_order_coded : coded version of the manipulation order variable

  • manipulation_value_coded : coded version of the manipulation question value variable

  • treatment_completed : binary variable to indicate if participants have completed the treatment intervention

  • donate_today_coded : binary variable to indicate the donation intention of the participant to donate today

  • donate_later_coded : variable to indicate the donation intention of the participant to donate later

  • stay_connected_coded : variable to indicate if the participant would like to stay connected with the chatbot

  • feedback_match_coded : coded version of the feedback variable

  • feedback_has_link : binary variable to indicate if the feedback contains a hyperlink

  • share_with_friend_coded : variable to indicate if the participant would like to share the link with friends

  • charity_mismatch_type_1 = 1 if the expected charity name is not missing but the revealed charity name is missing

  • charity_mismatch_type_2 = 1 if the expected charity name does not match the revealed charity name

  • important_smart_coded = score for the importance of smart giving

  • important_responsive_coded= score for the importance of responsive giving

  • important_forward_looking_coded = score for the importance of forward-looking giving

  • for_me_coded = is it for me

df_wide <- data %>% 
    select(analytic_id, source_coded, repeat_quiz_coded, greeting_coded, pre_consent_coded, not_affil_coded,
    consent_coded_num, country_charity_coded, main_cause_coded, sub_cause_coded, 
    charity_name_coded, has_logo_coded, donor_type_coded, arm_coded, charitable_intro_start_time,
    charitable_intro_end, charitable_match_start, charitable_match_end, charitable_affirm_start,
    charitable_affirm_end, charitable_reveal_start, charitable_reveal_end, charitable_treatment_start_time,
    charitable_treatment_end, time_since_first_start, time_since_consent, time_since_match_start,
    time_since_intervention, time_since_reveal, duration_intro, duration_match, duration_affirm,
    duration_reveal, duration_treatment, proper_order, treatment_text, text_has_link, manipulation_order_coded,
    manipulation_value_coded, treatment_completed, donate_today_coded, donate_later_coded, stay_connected_coded, feedback_match_coded, feedback_has_link, share_with_friend_coded, charity_mismatch_type_1, charity_mismatch_type_2, important_smart_coded, important_responsive_coded, important_forward_looking_coded, for_me_coded)


# labeling   
library(Hmisc)

label(df_wide$analytic_id) <- "Unique identifier for each participant"
label(df_wide$source_coded) <- "1 if entered via JSON AD, 0 otherwise"
label(df_wide$repeat_quiz_coded) <- "Binary flag for whether the participant repeated the charity matching quiz"
label(df_wide$greeting_coded) <- "Binary flag for whether the participant passed the greeting stage"
label(df_wide$pre_consent_coded) <- "Binary flag for whether the participant passed the pre-consent stage"
label(df_wide$consent_coded_num) <- "Binary flag for whether the participant gave consent to the study"
label(df_wide$not_affil_coded) <- "Binary flag for whether the participant passed the not affiliated stage"
label(df_wide$country_charity_coded) <- "Country of charity (US or Global) selected by the participant"
label(df_wide$main_cause_coded) <- "Main cause of charity selected by the participant"
label(df_wide$sub_cause_coded) <- "Sub cause selected by the participant"
label(df_wide$charity_name_coded) <- "Charity name revealed to the participant"
label(df_wide$has_logo_coded) <- "Binary flag for whether the charity has a logo"
label(df_wide$donor_type_coded) <- "Donor type assigned to the participant"
label(df_wide$arm_coded) <- "Treatment assignment of the participant"
label(df_wide$charitable_intro_start_time) <- "Time stamp when participant entered the chatbot"
label(df_wide$charitable_intro_end) <- "Time stamp after participant saw the statement 'Awesome! Let's find your charity soulmate'"
label(df_wide$charitable_match_start) <- "Time stamp when participants began the charity matching quiz"
label(df_wide$charitable_match_end) <- "Time stamp when participants finished providing their responses for the charity matching quiz"
label(df_wide$charitable_affirm_start) <- "Time stamp when participants started answering the affirmation questions"
label(df_wide$charitable_affirm_end) <- "Time stamp when participants finished answering the affirmation questions"
label(df_wide$charitable_reveal_start) <- "Time stamp when participants started seeing the charity reveal"
label(df_wide$charitable_reveal_end) <- "Time stamp at the end of charity reveal"
label(df_wide$charitable_treatment_start_time) <- "Time stamp when participants got assigned a treatment group"
label(df_wide$charitable_treatment_end) <- "Time stamp at the end of the intervention"
label(df_wide$time_since_first_start) <- "Time started the chatbot since the experiment began in days"
label(df_wide$time_since_consent) <- "Time conseted since the experiment began in days"
label(df_wide$time_since_match_start) <- "Time started the charity matching quiz since the experiment began in days"
label(df_wide$time_since_intervention) <- "Time started the intervention since the experiment began in days"
label(df_wide$time_since_reveal) <- "Time started the charity reveal since the experiment began in days"
label(df_wide$duration_intro) <- "Duration of the introduction stage in minutes"
label(df_wide$duration_match) <- "Duration of the charity matching quiz in minutes"
label(df_wide$duration_affirm) <- "Duration of the affirmation questions in minutes"
label(df_wide$duration_reveal) <- "Duration of the charity reveal in minutes"
label(df_wide$duration_treatment) <- "Duration of the intervention in minutes"
label(df_wide$proper_order) <- "Flag for participants who have a time sequence that is in the correct order"
label(df_wide$treatment_text) <- "Free text responses from participants in the opportunity and obligation arm"
label(df_wide$text_has_link) <- "Binary variable to indicate if the response contains a hyperlink"
label(df_wide$manipulation_order_coded) <- "Coded version of the manipulation order variable"
label(df_wide$manipulation_value_coded) <- "Coded version of the manipulation question value variable"
label(df_wide$treatment_completed) <- "Binary variable to indicate if participants have completed the treatment intervention"
label(df_wide$donate_today_coded) <- "Binary variable to indicate the donation intention of the participant to donate today"
label(df_wide$donate_later_coded) <- "Variable to indicate the donation intention of the participant to donate later"
label(df_wide$stay_connected_coded) <- "Variable to indicate if the participant would like to stay connected with the chatbot"
label(df_wide$feedback_match_coded) <- "Feedback to charity match"
label(df_wide$feedback_has_link) <- "Binary variable to indicate if the feedback contains a hyperlink"
label(df_wide$share_with_friend_coded) <- "Variable to indicate if the participant would like to share the link with friends"
label(df_wide$charity_mismatch_type_1) <- "1 if the expected charity name is not missing but the revealed charity name is missing"
label(df_wide$charity_mismatch_type_2) <- "1 if the expected charity name does not match the revealed charity name"
label(df_wide$important_smart_coded) <- "Score for the importance of smart giving"
label(df_wide$important_responsive_coded) <- "Score for the importance of responsive giving"
label(df_wide$important_forward_looking_coded) <- "Score for the importance of forward-looking giving"
label(df_wide$for_me_coded) <- "Is it for me"


var_names <- names(df_wide)

# Extracting labels
var_labels <- sapply(df_wide, label)

# Combine into a data frame
label_wide <- data.frame(Variable = var_names, Label = var_labels, stringsAsFactors = FALSE)

write.csv(label_wide, "./Data/Processed/wide_data_variable.csv", row.names = FALSE)

fwrite(df_wide, "./Data/Processed/charitable_clean_wide.csv.gz")

saveRDS(df_wide, "./Data/Processed/charitable_clean_wide.rds")