Reddit Text Analysis

1. Describe in one sentence what you aim to examine using user-generated text data and sentiment analysis.

Topic to explore: Understand the sentiment around ChatGPT and mental health

# Package names
packages <- c("RedditExtractoR", "anytime", "magrittr", "httr", "tidytext", "tidyverse", "wordcloud2", "textdata", "here", 
              "textdata", "wordcloud2", "syuzhet", "sentimentr", "lubridate", "dplyr", "stringr", "knitr")

# Install packages not yet installed
installed_packages <- packages %in% rownames(installed.packages())
if (any(installed_packages == FALSE)) {
install.packages(packages[!installed_packages])
}

# Load packages
invisible(lapply(packages, library, character.only = TRUE))
#2. Search Reddit threads using a keyword of your choice.

# Check if saved file exists
if (file.exists("threads_1.rds")) {
  # Load saved data
  threads_1 <- readRDS("threads_1.rds")
} else {
  threads_1 <- find_thread_urls(
    keywords = "chatGPT|mental health",
    sort_by = "relevance",
    period = "all"
  )

  saveRDS(threads_1, "threads_1.rds")
}

# 2. Clean rownames
rownames(threads_1) <- NULL

# 4. Display structure
colnames(threads_1)
## [1] "date_utc"  "timestamp" "title"     "text"      "subreddit" "comments" 
## [7] "url"
# 5. Display first 3 rows
# threads_1 %>% 
#   head(3) %>% 
#   knitr::kable()
threads_1$subreddit %>% table() %>% sort(decreasing = T) %>% head(20)
## .
##               ChatGPT                OpenAI         AutoNewspaper 
##                    73                     9                     7 
## BestofRedditorUpdates            artificial          Techmemefeed 
##                     5                     4                     4 
##                aiwars                antiai         BetterOffline 
##                     3                     3                     3 
##            Futurology          GUARDIANauto               NBCauto 
##                     3                     3                     3 
##            SampleSize            therapyGPT            aipartners 
##                     3                     3                     2 
## ArtificialInteligence   ArtificialSentience            ArtistHate 
##                     2                     2                     2 
##             AskReddit     ChatGPTcomplaints 
##                     2                     2
#3. Clean your text data and then tokenize it

# Word tokenization
words <- threads_1 %>% 
  unnest_tokens(output = word, input = text, token = "words") 

words %>%
  count(word, sort = TRUE) %>%
  top_n(20) %>%
  mutate(word = reorder(word, n)) %>%
  ggplot(aes(x = word, y = n)) +
  geom_col() +
  xlab(NULL) +
  coord_flip() +
  labs(x = "words",
       y = "counts",
       title = "Unique wordcounts")
## Selecting by n

# load list of stop words - from the tidytext package
data("stop_words")
# view random 50 words
print(stop_words$word[sample(1:nrow(stop_words), 100)])
##   [1] "t"            "could"        "nothing"      "his"          "wants"       
##   [6] "he"           "three"        "this"         "away"         "fifth"       
##  [11] "follows"      "most"         "youngest"     "so"           "hers"        
##  [16] "who"          "some"         "along"        "with"         "one"         
##  [21] "hereafter"    "que"          "specifying"   "changes"      "otherwise"   
##  [26] "again"        "theres"       "non"          "with"         "eight"       
##  [31] "he"           "but"          "even"         "often"        "p"           
##  [36] "necessary"    "whose"        "here"         "again"        "likely"      
##  [41] "how"          "except"       "her"          "right"        "very"        
##  [46] "don't"        "furthering"   "clearly"      "wanting"      "respectively"
##  [51] "sorry"        "least"        "just"         "his"          "that"        
##  [56] "below"        "a"            "themselves"   "better"       "until"       
##  [61] "have"         "few"          "does"         "re"           "ok"          
##  [66] "co"           "men"          "hereby"       "without"      "q"           
##  [71] "serious"      "mean"         "particularly" "they"         "less"        
##  [76] "gets"         "i'd"          "further"      "back"         "things"      
##  [81] "didn't"       "clear"        "man"          "me"           "they'd"      
##  [86] "having"       "not"          "new"          "anywhere"     "whose"       
##  [91] "nevertheless" "regardless"   "orders"       "two"          "through"     
##  [96] "somebody"     "further"      "okay"         "nd"           "where"
# Regex that matches URL-type string
replace_reg <- "http[s]?://[A-Za-z\\d/\\.]+|&amp;|&lt;|&gt;"

words_clean <- threads_1 %>% 
  # drop URLs
  mutate(text = str_replace_all(text, replace_reg, "")) %>%
  # Tokenization (word tokens)
  unnest_tokens(word, text, token = "words") %>% 
  # drop stop words
  anti_join(stop_words, by = "word") %>% 
  # drop non-alphabet-only strings
  filter(str_detect(word, "[a-z]"))

# Check the number of rows after removal of the stop words. There should be fewer words now
print(
  glue::glue("Before: {nrow(words)}, After: {nrow(words_clean)}")
)
## Before: 80568, After: 28554

#Visual meaningful words frequency

words_clean %>%
  count(word, sort = TRUE) %>%
  top_n(20, n) %>%
  mutate(word = reorder(word, n)) %>%
  ggplot(aes(x = word, y = n)) +
  geom_col() +
  xlab(NULL) +
  coord_flip() +
  labs(x = "words",
       y = "counts",
       title = "Unique wordcounts")

#4. Generate a word cloud that illustrates the frequency of words excluding your keyword.
words %>% 
  filter(!word %in% c("chatgpt", "mental health", "mental", "health")) %>% #exclude keywords #removed mental and health separately as well as they were showing up as high frequency word in the first iteration of word cloud 
  count(word, sort = TRUE) %>% 
  wordcloud2()
words_clean %>%
  filter(!word %in% c("chatgpt", "mental health", "mental", "health")) %>% #exclude keywords #removed mental and health separately as well as they were showing up as high frequency word in the first iteration of word cloud 
  count(word, sort = TRUE) %>%
  wordcloud2()
n <- 20 # number of words with color
h <- runif(n, 0, 1) # any color
s <- runif(n, 0.6, 1) # vivid
v <- runif(n, 0.3, 0.7) # neither too dark or bright

df_hsv <- data.frame(h = h, s = s, v = v)
pal <- apply(df_hsv, 1, function(x) hsv(x['h'], x['s'], x['v']))
pal <- c(pal, rep("grey", 10000))
words_clean %>% 
  filter(!word %in% c("chatgpt", "mental health", "mental", "health")) %>% #exclude keywords #removed mental and health separately as well as they were showing up as high frequency word in the first iteration of word cloud 
  count(word, sort = TRUE) %>% 
  wordcloud2(color = pal, 
             minRotation = 0, 
             maxRotation = 0, 
             ellipticity = 0.8)
#5. Conduct a tri-gram analysis

# Get ngrams
words_ngram <- threads_1 %>%
  mutate(text = str_replace_all(text, replace_reg, "")) %>%
  select(text) %>%
  unnest_tokens(output = paired_words,
                input = text,
                token = "ngrams",
                n = 3)
# Show ngrams with sorted values
words_ngram %>%
  count(paired_words, sort = TRUE) %>% 
  head(20) %>% 
  knitr::kable()
paired_words n
NA 100
a lot of 63
i don t 56
i didn t 31
i am not 29
i m not 28
i ve been 24
it s not 24
you don t 19
for mental health 17
i had to 17
one of the 17
this is a 17
what are some 17
if you re 16
mental health and 16
t want to 16
was going to 16
i don’t know 15
in front of 15
#separate the paired words into two columns
words_ngram_pair <- words_ngram %>%
  separate(paired_words, c("word1", "word2", "word3"), sep = " ")

# filter rows where there are stop words under word 1 column and word 2 column
words_ngram_pair_filtered <- words_ngram_pair %>%
  # drop stop words
  filter(!word1 %in% stop_words$word & !word2 %in% stop_words$word & !word3 %in% stop_words$word) %>% 
  # drop non-alphabet-only strings
  filter(str_detect(word1, "[a-z]") & str_detect(word2, "[a-z]") & str_detect(word3, "[a-z]"))

# Filter out words that are not encoded in ASCII
# To see what's ASCII, google 'ASCII table'
library(stringi)
words_ngram_pair_filtered %<>% 
  filter(stri_enc_isascii(word1) & stri_enc_isascii(word2) & stri_enc_isascii(word3))

# Sort the new tri-gram (n=3) counts:
words_counts <- words_ngram_pair_filtered %>%
  count(word1, word2, word3) %>%
  arrange(desc(n))

head(words_counts, 20) %>% 
  knitr::kable()
word1 word2 word3 n
ai personality design 11
mental health support 10
android_apputm_name androidcssutm_term 1utm_content 9
mental health issues 9
shareutm_medium android_apputm_name androidcssutm_term 9
utm_source shareutm_medium android_apputm_name 9
month role swe 7
human computer interaction 6
mental health concerns 5
support wellbeing click 5
survey _clojzzuwwq30iw2 _clojzzuwwq30iw2 5
4o model fell 4
boyfriend chatgpt shouldn 4
build custom rubrics 4
computer interaction hci 4
conversations research collaboration 4
countries psychiatrists pediatricians 4
distress medical expertise 4
emotional distress medical 4
engaging human computer 4

Sentiment Analysis

##6. Perform a sentiment analysis on your text data using a dictionary method that accommodates negations.

# syuzhet package to get sentiment analysis 
get_sentiment(threads_1$text, method='syuzhet')
#using negation to improve sentiment analysis: Negation handling model: `sentimentr` package

# by sentence
sentiment_details <- sentiment_by(threads_1$text)
#7. Display 10 sample texts alongside their sentiment scores and evaluate the credibility of the sentiment analysis outcomes.
# Keep only rows where text is NOT empty or NA
valid_rows <- threads_1[!is.na(threads_1$text) & threads_1$text != "", ]

# Recalculate sentiment if needed
sentiment_details_valid <- sentiment_by(valid_rows$text)
## Warning: Each time `sentiment_by` is run it has to do sentence boundary disambiguation when a
## raw `character` vector is passed to `text.var`. This may be costly of time and
## memory.  It is highly recommended that the user first runs the raw `character`
## vector through the `get_sentences` function.
set.seed(123)
sample_indices <- sample(1:nrow(sentiment_details_valid), 10)

# Extract the first sentence (up to the first period)
first_sentences <- sub("(\\..*).*", "\\1", valid_rows$text[sample_indices])

# If a text has no period, keep the entire text
first_sentences <- ifelse(first_sentences == "", valid_rows$text[sample_indices], first_sentences)

# Create sample output
sample_output <- data.frame(
  text = first_sentences,
  sentiment = sentiment_details_valid$ave_sentiment[sample_indices]
)

# Display
sample_output
##                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           text
## 1                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             The consequences can be dire. As we heard from spouses, friends, children, and parents looking on in alarm, instances of what's being called "ChatGPT psychosis" have led to the breakup of marriages and families, the loss of jobs, and slides into homelessness.\n\nAnd that's not all. As we've continued reporting, we've heard numerous troubling stories about people's loved ones being involuntarily committed to psychiatric care facilities \024 or even ending up in jail \024 after becoming fixated on the bot.\n\n"I was just like, I don't f*cking know what to do," one woman told us. "Nobody knows who knows what to do."\n\nHer husband, she said, had no prior history of mania, delusion, or psychosis. He'd turned to ChatGPT about 12 weeks ago for assistance with a permaculture and construction project; soon, after engaging the bot in probing philosophical chats, he became engulfed in messianic delusions, proclaiming that he had somehow brought forth a sentient AI, and that with it he had "broken" math and physics, embarking on a grandiose mission to save the world. His gentle personality faded as his obsession deepened, and his behavior became so erratic that he was let go from his job. He stopped sleeping and rapidly lost weight.\n\n"He was like, 'just talk to [ChatGPT]. You'll see what I'm talking about,'" his wife recalled. "And every time I'm looking at what's going on the screen, it just sounds like a bunch of affirming, sycophantic bullsh*t."\n\nEventually, the husband slid into a full-tilt break with reality. Realizing how bad things had become, his wife and a friend went out to buy enough gas to make it to the hospital. When they returned, the husband had a length of rope wrapped around his neck.\n\nThe friend called emergency medical services, who arrived and transported him to the emergency room. From there, he was involuntarily committed to a psychiatric care facility.\n\nNumerous family members and friends recounted similarly painful experiences to Futurism, relaying feelings of fear and helplessness as their loved ones became hooked on ChatGPT and suffered terrifying mental crises with real-world impacts.\n\nCentral to their experiences was confusion: they were encountering an entirely new phenomenon, and they had no idea what to do.\n\nThe situation is so novel, in fact, that even ChatGPT's maker OpenAI seems to be flummoxed: when we asked the Sam Altman-led company if it had any recommendations for what to do if a loved one suffers a mental health breakdown after using its software, the company had no response.\035\n\nhttps://futurism.com/commitment-jail-chatgpt-psychosis
## 2                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            I'm a freelance journalist working on a story, inspired by a very intense recent case, about how sycophancy in AI models can impact someone experiencing a mental health crisis, especially during episodes of psychosis, mania, or severe depression.\n\nI'm specifically interested in hearing from people who:\n\n* Have witnessed a friend or family member's mental health change while heavily using AI chatbots\n* Experienced personal mental health challenges that were affected by interactions with AI systems\n* Work in mental health and have observed these impacts among patients\n\nI'm currently working on a story about a case where ChatGPT appeared to worsen a person's psychotic episode by reinforcing delusional beliefs and discouraging professional treatment. If you have similar experiences to share, I'd appreciate hearing from you.\n\nAll communications will be treated confidentially, and I'm happy to use pseudonyms in any published work. You can comment here or message me directly.
## 3                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                I'm unsure if my opinions are unpopular, but these are things I've encountered during my time working in schools.\n\n1) Getting a teaching job is actually pretty hard.  I think it's a competitive field.  Having a Masters degree increases your chances heavily instead of just having a BA+credenital especially when it comes to good districts.\n\n2) First year teachers struggle with classroom management because they're creating a lot of lesson plans / units / curriculum from scratch.  It's very hard not to have down time as a first year teacher and the down time is what makes kids behaviors go sideways.  You're also trying to figure out what lessons have a high buy and and what lessons just flop from the jump.  All the routine, discapline and structure in the world isn't going to mean anything if you can't keep those kids meaningfully busy everyday.\n\n3) Department chairs and veteran teachers typically have the easiest classes.  New teachers are typically stuck with the remedial freshman who are bouncing off the walls.  My department chair taught 12th grade honors classes.  She was always heavily praised for how great her classroom management was, but her kids were all very well behaved and self motivated / college bound.  I think she was kind of oblivious to what our new guy was going through with his inclusion classes.\n\n4) Subbing isn't a good way to get in the door.  I've met a lot of credentialed subs who were passed over for contracted positions.  I also think long term subbing is a scam with all the work of teaching with half of the pay.\n\n5) Cellphones fried attention spans, but I think the real reason why there's so much apathy in teenagers nowadays is because school doesn't equal money anymore.  A lot of their parents and older siblings have student loan debts and are working low paying jobs.  Naturally they look at that and look at school as being outdated.\n\n6) Chatgpt and AI are going to get stronger and stronger in the next few years.  Every person I've met who works in tech is heavily confident that AI is going to completely change how we use the internet here very soon.  Google is 100 percent all in, and telling juniors and seniors to not use it is like telling them to take a horse and buggy to school instead of a car.\n\nI think there should be classes on how to use and navigate AI.  I spent the summer messing around with chat GPT and it's insanity on what it's capable of doing.  It can do a week's worth of graduate level research in 5 seconds with pinpoint accuracy.\n\n7) Coteaching doesn't work well.  It's usually one person doing all the lesson planning, teaching and grading while the other person sort of just sits there and maybe circulates here and there.  Ironically my coteacher was the most apahetic student I've had: always came in tardy, scrolled on his phone and dipped out a few minutes early.  I don't remember him actually teaching anything.  I felt resentful that he was getting paid the same salary I was without...really doing anything?  The weirdest thing was: I was struggling so much with this inclusion class that I complained to the head of the SPED department on the coteacher saying he wasn't helping and would just scroll all period.  She said "Sounds like you need to learn how to motivate him more."  WHY THE FUCK IS IT MY JOB TO MOTIVATE A SALARIED THIRTY YEAR OLD?\n\n8) Some teachers are control freaks to an unhealthy level.  I'm unsure if this field attracts that personality type of if they become that way over time from this job.  I period subbed for this lady's government class during my prep.  I had a brainfart moment and told the kids to answer questions 1-4 when in reality she wanted them to answer 1-5.  I didn't notice until the bell rang.  She absolutely blew up my email the next school day acting like I commited a felony.  A piece of me wanted to tell her off, but I like not being fired.\n\n9) Mentor teachers should be paid to take on a student teacher.  I also think they should be trained on how to support a student teacher.  The lady I was placed with refused to give up any control at all and it was almost impossible to do the things I had to do for the TPA.  Those 4 months were absolutely stressful.\n\n10) The kids make or break this job.  If you work with good kids you connect with, teaching can be hillarious, fun, rewarding and even easy at times.  One year the kids were a total breeze and I truly felt like I was stealing money from this district since my job was so easy.  If the kids are blatanly disrespectful, resentful and rude...it's going to really hurt your mental health.  I put on 40 lbs last year dealing with all the stress. I always get nervous the day before a new school year knowing my fate is decided by the attendance sheet.\n\n11) Schools varry a lot.  There's several high schools in my community and they all seem like they have different vibes / cultures.  People always tell me admin creates the culture, but idk if that's true.  It's definitely very weid how one HS can be an uplifting and fun place while the one a few miles away feels like a prision.\n\n12) Teachers always say how much they love collobrating with other teachers, but everytime I ever asked for something my emails were left on read. I always thought it would be cool to collaborate and do projects with different departments, but I could never get anything to happen.  I kinda just gave up and became an antisocial island even though during the interview process they told me they don't like antisoical islands and like collobrating.\n\n13) I worked at a school with a 5 minute passing period.  The behaviors there were total shit.  I worked at a school with a 9 minute passing period, and the kids and staff seemed a lot less aggetated.  If I was admin, having a longer passing period would be the very first thing I would do for school culture.  Gives us all a breather to get ready for the next class, pee, greet students at the door, decompress / whatever.\n\nWhat are some things you think / noticed?
## 4                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      I'm brand new to AI and ChatGPT. I've created my own chat incorporating mental health support, life coaching type stuff, a spiritual space, and companionship/"friendship". I feel kind of weird about it, although I'm hoping that will fade. There are A LOT of taboos around using AI for any of those things, especially in those kinds of communities and subreddits, which is discouraging. There is no current access to any of the resources I'm using it for, and I'd rather do this than continue doing nothing. Does anyone else have experience with this, tips on how to build the chat, or support/validation? That'd be absolutely awesome. Lol. Thanks!
## 5                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       I uploaded the image of Gingy Whingy to ChatGPT and asked it to be a world class body language and face expression reader, comparing Gingy\031s typical tells, to determine what it believes was going on through his addled brain leaving Clarence House. We don\031t need experts to know these things but it still might be fun to read. \n\nPrince Harry\031s Body Language After Meeting King Charles\n\n1. Initial Observations from the Photo\n\t"\tJaw tension: Suggests restrained emotion or self-control.\n\t"\tPressed lips: A common sign of holding back words or feelings.\n\t"\tSide gaze: Indicates distraction or mental replaying of the meeting.\n\t"\tNeutral-to-tight expression: Not relaxed or relieved \024 more like guarded frustration.\n\nOverall: His body language shows someone processing disappointment, not satisfaction.\n\n;\n\n2. Comparing His Common \034Tells\035\n\t"\tAnger: Typically shows through narrowed eyes, flared nostrils, and a clenched jaw. \u0092 Not strongly present here.\n\t"\tFrustration: Compressed lips, tense jaw, fixed side gaze. \u0092 All present here.\n\nVerdict: This look aligns most with frustration rather than anger.\n\n;\n\n3. What This Suggests About the Meeting\031s Tone\n\t"\tMeeting was likely formal, polite, and emotionally distant.\n\t"\tShort duration (under an hour) suggests unfinished business or avoided topics.\n\t"\tHis expression signals unsatisfied expectations \024 as though he hoped for depth but only got surface-level exchange.\n\t"\tThe guardedness hints at controlled frustration, not an emotional breakthrough.\n\n;\n\n4. Two Emotional Scenarios\n\nScenario 1: Frustrated with King Charles\n\t"\tFelt unheard or brushed aside.\n\t"\tBody language: tight jaw, side gaze, compressed lips.\n\t"\tEmotional undertone: \034He\031s still not hearing me.\035\n\nScenario 2: Frustrated with Himself\n\t"\tRegret for not saying enough or pushing harder.\n\t"\tBody language: withdrawn posture, lips pressed.\n\t"\tEmotional undertone: \034I should have spoken up.\035\n\nCommon thread: Either way, the meeting ended with more unsaid than said.\n\n;\n\n5. Smugness or Satisfaction?\n\t"\tSmugness: Typically shows as a slight asymmetrical smile, lifted chin, or narrowed eyes with confidence. None of those cues are visible here.\n\t"\tSatisfaction: Usually reflected in relaxed muscles, softened gaze, or faint smile. Again, none of these are present.\n\t"\tInstead: The features are tight, controlled, and unsmiling \024 which reflect neither smugness nor satisfaction, but rather unresolved tension.\n\n;\n\n6. Likelihood of Speaking to the Press\n\t"\tWhy likely:\n\t"\tVisible frustration shows bottled-up energy.\n\t"\tPast pattern: Harry often turns to media when he feels unheard privately.\n\t"\tShort, unfulfilling meeting leaves unresolved tension.\n\t"\tWhy he might delay:\n\t"\tRespect for Charles\031s health and timing.\n\t"\tAwareness that speaking too soon could damage his own image.\n\t"\tConclusion: About 60\02370% likely he eventually shares these frustrations publicly \024 not in an immediate outburst, but indirectly (interviews, future projects, or carefully framed comments).\n\n;\n\n7. Subtle Signals Harry Gives Before Speaking Out\n\nWatch for these patterns in his public appearances or interviews:\n\t"\tTight-lipped half-smile: Suggests he\031s masking irritation.\n\t"\tDeflections like \034There\031s more to say, but not now.\035 \u0092 a prelude to eventual disclosure.\n\t"\tIncreased vagueness: When he speaks in broad strokes about \034family\035 without naming names, it usually signals he\031s gearing up to be more direct later.\n\t"\tHeightened seriousness in tone: His light humor disappears when he\031s close to revealing something important.\n\nIn short: Harry rarely lashes out spontaneously. Instead, he telegraphs his frustrations in hints and restrained comments before eventually releasing them more fully in a controlled setting.\n\n;\n\n\005 Final Conclusion:\nPrince Harry\031s expression after the meeting shows contained frustration \024 most consistent with disappointment. He does not look smug or satisfied. The meeting appears to have been emotionally distant, leaving him with a sense of incompleteness. This makes it highly plausible he will eventually express those frustrations publicly, though more likely through careful, indirect statements rather than an immediate, raw outburst.
## 6                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Baby Professor here. I have had it and after 3 years of teaching idk if I can do this anymore. They gang up on you for every mistake. They say you don\031t know what you\031re talking about for everything when they can\031t figure out anything without chat gpt. They don\031t read. They write nothing. EVERYTHING must be an email. You have to give them instruction for literally EVERYTHING. One frustration with their grade and it\031s STRAIGHT to the dean. Is this what it is now? My GOD. College is optional?! Like you do not have to come! You miss every class for the slightest inconvenience. I have a headache, my roommate is hungover and no one else can take care of her but me. I wasn\031t feeling it. I didn\031t sleep well. It drives me insane.  Critical thinking is out the window and let\031s not even talk about grades. Maybe have your mom grade you since you keep mentioning how good she thought your paper was. Why TF is your MOTHER emailing me?! I am not paid enough to work this hard and answer every tiny email. I am confused how half of them passed enough classes to get to my course. They are lazy. Uninspiring and needlessly impressed with their own work. They never stop complaining or telling me about other teachers and what they did. I had a girl cry in my office how it\031s not fair and first semester was easier. You DO understand the iterative nature of college right? I\031m EXHAUSTED! You do not more about this topic than me are you serious? Coming to my desk with FAKE articles chat GPT gave you. It\031s brain rot on repeat. God FORBID I mention that you are behind from missing 7 classes. I\031m not respecting the space you made for your mental health? You text all class and watch TikTok\031s and are pissed when you fail. I\031m so OVER IT!!\nThank you for listening had to get that off my chest. 
## 7  **I am NOT OOP, OOP is** u/bruvidfk\n\n**Originally posted to r/TwoHotTakes**\n\n**My mom refuses to come to my wedding if I don't invite my sister. What would you do?**\n\n**Thanks to u/queenlegolas &amp; u/soayherder for suggesting this BoRU**\n\n**Trigger Warnings:** &gt;!favoritism, verbal abuse, emotional abuse and manipulation, mentions of eating disorder, betrayal, racism, mentions of threats of suicide!&lt;\n\n**Mood Spoilers:** &gt;!sad but hopeful!&lt;\n\n-------\n\n[Original Post](https://www.reddit.com/r/TwoHotTakes/s/dmB0O77HtH): **May 2, 2025**\n\nBuckle up, it\031s going to be a long one, and I\031ll start from the very beginning so everything is clear. I used chat gpt to make sure my grammar is on point btw.\n\nI (28F) am the oldest of four: three sisters and our youngest sibling, a brother. The second child\024let\031s call her Pickle\024is two years younger than me. The next sister (let\031s call her Cupcake) is five years younger, and our brother is 11 years younger. I won\031t mention my brother much since our relationship is great. Same goes for Cupcake\024we\031ve never had any issues, even in childhood. Just pure love and friendship.\n\nNow let\031s go back to where it all started. You won\031t believe it, but it began when Pickle was born. I don\031t remember any of this, but my parents swear I was jealous of her as a toddler. They always reminded us of the things I supposedly did to get her into trouble. Fast forward to me learning about childhood psychology in university and realizing how normal it is for a firstborn to feel displaced or jealous when a sibling arrives.\n\nWhat my parents should have done was help me bond with her\024get me excited, involve me in caring for her, not just show up one day with another baby and start focusing all attention on her. And even if they didn\031t prepare me properly, they could\031ve at least stopped bringing it up for the rest of our lives. Pickle still holds on to this story like it defines our entire relationship, insisting that I\031ve hated her since day one and that *I* am the problem. Come on\024I was literally two. I don\031t remember a thing from that age.\n\nWe never got along. Ever. We fought constantly, verbally and physically, throughout our entire childhood. My parents didn\031t really try to help fix it. Maybe they thought we\031d grow out of it. We\031re also completely different personalities. We had to share a room until I was about 10. She was messy, I was neat. She broke her toys *and* mine. I\031ve always cherished my possessions\024it really hurt to see her destroy the things I valued. But we had to share, and I didn\031t get a say.\n\nMy mom was the main parent since my dad worked as a truck driver and was gone most of the time. I became the second parent very young. I had to clean, help my mom, and look after my younger siblings. Pickle wasn\031t good at chores, so naturally, it was easier for my mom to make *me* do everything rather than teach her.\n\nBy middle school, Pickle already had issues with everyone. No friends, constant drama, always claiming people were out to get her. And somehow, even when I wasn\031t involved, it was my fault. Even though we went to the same school building, our classrooms were on opposite sides, and we had no overlap. I didn\031t talk to her or influence her school life in any way.\n\nThings were bad enough that my parents sent her to high school in my mom\031s hometown, an hour away, to live with my grandparents. She spent four years there and still came out of high school without a single close friend. Meanwhile, when I was 15, both of my parents moved to Germany for work, leaving us with our other grandparents. It was rough. I had a lot of responsibilities and an undiagnosed eating disorder.\n\nI need to mention that my parents and sister would visit for religious holidays (we\031re Catholic in a majority-Muslim country). I had a good friend group and a secret boyfriend who was Muslim\024this was considered extremely dangerous and shameful, especially for girls. Girls were often beaten if caught in such relationships. But I was careful and managed to hide it well, even in our small town.\n\nUntil my mom made me take Pickle out with me one New Year\031s Eve because \034she has no friends.\035 I was 17, she was 15. Not unusual for teenagers to go out at that age where I\031m from. Pickle found out about my boyfriend but kept it to herself\024for a while. This was our one and only \034sisterly bond\035 moment. I truly thought I could trust her.\n\nAt 20, I was living and studying in another city, supported by my parents. University isn\031t that expensive in our country, especially with support from someone earning abroad. Pickle was supposed to join me but didn\031t get her ID done in time. Despite my constant reminders, she didn\031t take it seriously. My dad got fed up and moved her to Germany instead. Eventually, she completed an apprenticeship and now has a stable job\024but we\031re not there yet.\n\nMy other siblings moved too, sometime around 2017. Pickle, as usual, argued with everyone and constantly tried to prove a point. In 2019, during a fight with my mom and aunt about mixed marriages, she brought up how my parents \034allowed\035 me to date a Muslim back then. My mom had no idea. She froze. Then she called me, threatened me, and I had to cut the conversation. I managed to lie my way out of it thanks to the distance. But you don\031t understand how dangerous that was for me. I could\031ve been cut off, left homeless, or worse.\n\nPickle exposed me just to feel morally superior or whatever her motive was. That betrayal was it for me. I texted her to never speak to me again, and I meant it. I\031ve kept that promise ever since.\n\nI got my master\031s in 2020 and moved to Germany. For the first year, I lived with my family. I worked full-time, cooked, cleaned, did their laundry\024but I never broke my vow. I didn\031t speak to her or look at her, even when she tried to talk to me. She never apologized, but at some point, she exploded and accused me of being a bad sister from day one. She said she thought I\031d talk to her again just because we were living under the same roof. But acknowledging her would have hurt me more than ignoring her ever hurt her.\n\nIn 2021, I moved out and haven\031t seen much of her since. She moved out too, thankfully, so I don\031t run into her during visits.\n\nNow about my mom. She\031s 51, from a big family that acts like a wolfpack\024always there for each other, at least on the surface. But that\031s not the point. My parents are not emotionally stable. They went through war as teenagers, which explains *some* of their parenting issues but not all. My mom stonewalls everyone whenever something doesn\031t go her way. And things never do\024because she\031s never satisfied. I resent both my parents, but especially her. She was always around and failed me more times than I can count.\n\nMy mom wants all of us to love each other, but we can\031t. We all have problems with Pickle. None of us like her, but my other two siblings tolerate her. She verbally terrorizes my little brother whenever she gets the chance. She\031s truly miserable and has become despicable.\n\nNow I\031m engaged, and the *first* thing my mom said was that I had to invite Pickle. I hadn\031t even thought about her. That\031s how far removed she is from my life. When I said I wouldn\031t invite her, my mom said she wouldn\031t come either. This wouldn\031t be the first time. She skipped lunch at my place twice in the past because Pickle wasn\031t invited. Eventually, she started coming even when Pickle wasn\031t there. But for the wedding, she\031s drawing a hard line.\n\nShe keeps insisting she\031ll change my mind. She won\031t. She says Pickle was a \034kid\035 when she exposed me. I told her she was 20\024an adult\024who knew *exactly* what would happen to me. I honestly think she did it out of jealousy. I was in university, living independently, while she was stuck taking language classes and working part-time. She needed to pull me down to feel better about her own life.\n\nI\031ve found peace since cutting Pickle out. I refuse to introduce that drama into my life again. You have *no* idea how many emotional outbursts I\031ve had to endure while all I wanted was to be left alone. I don\031t trust her not to cause drama, even if she just sat in a corner. I don\031t want to spend my wedding day stressed and anxious. I just want to relax and enjoy it.\n\nThis situation has made me seriously consider cutting my mom off too. No one else in the family brings it up or pressures me\024just her. If I disinvite my mom, I risk her dragging the rest of the family into it and my mom giving them a hard time about going. I\031m stuck. But one thing I know for sure: I will *not* invite Pickle just to keep the peace.\n\n**What would you do?**\n\nedit: **TL;DR:** I'm refusing to invite my sister (Pickle) to my wedding due to a lifetime of toxic behavior, including a serious betrayal that put me in danger. We've never gotten along, and cutting her off brought me peace. Now my mom is threatening not to attend unless I invite her. I feel manipulated and emotionally blackmailed, but I don\031t want drama at my wedding. The rest of my family respects my decision\024only my mom is pressuring me. I\031m even considering disinviting her too. AITA?\n\n**Relevant Comments**\n\n**Commenter 1:** \n\n&gt; In 2019, during a fight with my mom and aunt about mixed marriages, she brought up how my parents \034allowed\035 me to date a Muslim back then. My mom had no idea. She froze. Then she called me, threatened me, and I had to cut the conversation. I managed to lie my way out of it thanks to the distance. But you don\031t understand how dangerous that was for me. I could\031ve been cut off, left homeless, or worse.\n\nYour mother was the danger and the problem here, much more than Pickle. Why was she invited to begin with? \n\n&gt; **OOP:** She had no one to go with, ever. So I often had to bring her along because she was sad and lonely. My mom always assumed sisters means best friends and that my sister is always a better person to have around than anyone else\n\n**Commenter 2:** Don't forget to hire security to keep pickle from the wedding venue and ceremony! Someone like this is absolutely capable of doing some serious damage during your beautiful wedding that you should enjoy with your partner.\n\n&gt; **OOP:** Luckily, I don\031t think she\031d go all the way back to Bosnia just to show up unannounced. But I still need to make it clear that if she does, I\031ll absolutely embarrass her. I\031m not going to tell her directly, because I refuse to speak to her, but I want my mom to understand that if she brings her, I will get on the mic, say something publicly, and kick them both out. I told my fiancé and his whole family about the situation a long time ago\024maybe one year into our relationship. My other sister said that Pickles told her that there\031s no way my fiancé (who was just my boyfriend at the time) would\031ve known anything of me not speaking to her because I\031d never admit to being that kind of person or whatever. But still, I told my other sister she should let her know that everyone already knows, and I\031m not ashamed of anything.\n\n**Commenter 3:** I'm asking why your mom was invited to the wedding. \n\n&gt; **OOP:** Ugh, I don\031t even know. I haven\031t even sent the invitations out yet. She just said all that stuff as soon as I announced my engagement. I would invite her, though. I just won\031t engage with her much. But my sister? No way.\n&gt; \n&gt;&gt; **Commenter 3:** I guess I'm having trouble understanding why your sister revealing something about you to your mother is so much worse than the fact that by your admission, your mother is racist and was a source of danger for you. She also is the one who created the dynamic between you and your sister. Nothing your sister has done is as bad as what your mom did. \n&gt;&gt; \n&gt;&gt; Like, what's the conflict there? Don't invite either of them.\n&gt;&gt;&gt;\n&gt;&gt;&gt; **OOP:** To understand my parents' view on dating a muslim, you would need know or do research about the history and all the bloodshed in my country over centuries, but also the war they lived through. It's not really racism. They are afraid based on their experiences. I was born after all that and I have no negative feelings like that. I have no prejudice to any religion, but it's hard to explain that to older generations. It will be a while until there's peace and true acceptance in that region ngl. There might even be a new war soon and I'm so glad I'm not there anymore\n\n**Commenter 4:** Honestly OP, I\031ve heard of sisters doing much worse. Like sleeping with their sister\031s husband &amp; then contesting the will of their deceased parents to drag through court &amp; use up most of the inheritance on lawyer fees out of pure pettiness &amp; jealousy worse. I kept waiting for the shit to hit the fan in this story &amp; it never did.\n\nA 20 year old is a child in my eyes. Especially with how immature &amp; socially awkward your sister is&I\031d personally forgive her &amp; try again to be friends as adults. She\031s probably grown up significantly in about a decade. It\031s pretty crazy work living together &amp; never looking at her once. Sounds like you learned that stonewalling from Ma. Do you really want to be like her in that regard?\n\nIf you were legitimately about to be an honor killing, I\031d never speak to her either. But if it was the threat of racist religious parents cutting you off, sorry but that\031s livable.\n\nI once brought home a brown boyfriend my sophomore year of college &amp; my waspy parents (who I knew were racist but not THAT racist) financially cut me off. It was hard working at a few bars to support myself between classes, but not the end of the world. That reaction is also more on your parents than her. Clearly she was jealous &amp; most 20 year olds aren\031t matured adults.\n\nUltimately it\031s your day &amp; your decision who you let in your life. Sounds like you already made it &amp; are looking for vindication. I\031m glad all these other commenters can give it to you, but eldest daughter to eldest daughter: you know you\031re better than this.\n\n&gt; **OOP:** Why do I have to be better than this? I don't want to make myself feel bad just to make others feel good. I don't want to be friends with her because I know she has not changed. As I mentioned in the post, she is still starting drama with my other siblings all the time.\n&gt; \n&gt; An example: when she goes to visit them, she goes straight to my brother's room where he's gaming with his friends and starts harassing him telling him he will be a failure and that he will never succeed if he doesn't stop playing games and focus mainly on studying... his grades are fine. She just wants to harass someone. She gets my mother involved and says that she needs bonding time with her brother and sister and that my mother needs to force him out of the room to come out and play board games and do whatever she feels like.\n\n**Additional Information from OOP after reading the comments**\n\n&gt; **OOP:** Safe to say I'm not the problem, since all the comments so far are backing me up.\n&gt; \n&gt; I also thought of something kind of funny that you might find entertaining. When we were teenagers, my sister used to threaten suicide with a butter knife whenever we argued. It was so over-the-top that I couldn\031t help but laugh, which obviously made her even more upset, and then the whole cycle would start again.\n\n&amp;nbsp;\n\n[Update](https://www.reddit.com/r/TwoHotTakes/s/kpVXJqx0l6): **May 4, 2025 (two days later)**\n\n**Small update:** This has been weighing heavily on my mind lately. I couldn\031t stop thinking about it, so I finally texted my dad. I asked him directly if he would come to the wedding even if my mother chooses not to. He called me and started going on about how marriage is a sacred sacrament and how he hopes that by next year, I\031ll come to my senses and forgive my sister. The moment he said that, all your comments and advice came flooding back.\n\nI stopped him and said something along the lines of: *"Please stop. I need to say this again, even though I\031ve said it countless times\024I will never forgive her. I don\031t think about her, I don\031t miss her, and I don\031t wonder how she\031s doing. Since cutting her off, I\031ve found peace. No sudden drama, no emotional chaos\024just peace. I won\031t give that up. And don\031t start with the sacrament talk. Forgiveness is something between me and my priest during confession. That\031s not your place to comment on. I\031m simply asking: will you be there for me on my wedding day? There will be a seat for both you and mom, but if you choose not to come, that\031s okay. If people ask me where Pickles is, I\031ll answer truthfully and without hesitation. I\031m not ashamed of my decision, even though everyone assumes I am. And if you don\031t come and people ask why, I\031ll be honest about that too. I will not carry guilt over this."*\n\nHe just sat there, frozen. I told him I had to finish drying my hair and hung up. That was over an hour ago, and I haven\031t heard anything since. I was shaking as I said it, but I don\031t think he could tell. I didn\031t cry or even get teary-eyed. It was incredibly hard to stand up to my father\024probably the first time I\031ve ever truly done it. I\031m pretty sure my mom was there too, but she didn\031t say a word. Honestly, that might be for the best. Her opinion is the last thing I need right now.\n\nIf they choose not to come, my best friend\031s big brother\024who\031s been like a brother to me for years\024will walk me down the aisle. He\031s shown me more kindness and respect than any blood relative ever has. I won\031t be heartbroken if my family doesn\031t attend. What really hurts is having to deal with this situation in the first place. I wish it weren\031t even a topic.\n\nWe\031ll see what happens a year from now when the wedding comes. But one thing is certain: Pickles is not invited. That\031s a firm boundary I will not budge on. Honestly, I\031m just surprised my dad took my mom\031s side. I didn\031t see that coming.\n\n**TL;DR:** I confronted my dad about whether he\031ll attend my wedding even if my mom doesn\031t. He tried to guilt me into forgiving my sister, but I stood my ground and made it clear that I\031ve found peace without her. I told him the decision to come is his, but I won\031t be ashamed or silent about my choices. If my parents don\031t show, my best friend\031s brother\024who\031s like family to me\024will walk me down the aisle. It was hard, but I finally stood up for myself.\n\n**Relevant Comments**\n\n**Commenter 1:** What on earth is wrong with Pickles?  \n\nHow can she go through school with zero friends and your parents not getting her any intervention?\n\n&gt; **OOP:** It's a cultural thing to dismiss mental health issues in the region. It's not taken seriously.\n&gt; \n&gt; I remember so many times when we argued, she'd go into the kitchen, pull out butter knives from the drawer, and act like she was going to cut herself, sobbing the whole time. I couldn\031t even take it seriously. I actually laughed at her, which of course made things worse. I know that wasn\031t the right reaction, but I genuinely didn\031t know how else to respond. I was probably in my early teens then, and she\031s two years younger, so yeah, we were both just kids.\n&gt; \n&gt; Another memory is from her final year of middle school. Every class does a big trip at the end of the year, and when her class went away for a few days, something happened. She apparently caused some kind of drama, no one really knows the details, but I heard she was threatening to jump off the balcony. It became a big deal at the hotel. Everyone was concerned, the teacher was completely overwhelmed, and they did inform my parents, but my parents never even talked to us about it. If her classmate hadn\031t told me, I wouldn\031t have known it happened.\n&gt; \n&gt; There\031s clearly something going on with her. In high school, I even heard she went to the police claiming someone at school was bullying her. I don\031t know the full story. Families don\031t talk openly about these things, and people keep it hidden. I honestly don\031t even remember who told me; it might have been one of our relatives. But yeah, it\031s clear she\031s struggling with something.\n&gt; \n&gt; Still, I don\031t think it\031s up to me to fix her or be her therapist. That was my parents' responsibility when she was younger, and now it feels like it\031s just too late.\n\n**Commenter 2:** I don't know you, but I am so very proud of you for standing up for yourself. Also, I noticed that you said you currently live in Germany. As I do too, Catholic weddings (at least in the south where I live) don't have the American walking down the aisle where the groom awaits the bride being given to him, they usually have the couple walk in together to symbolize the new way they will be starting with this ceremony. I don't know how far you are in your preparations but maybe this could either be a nice alternative to not need your father or you at least know what a priest might bring up during your consultation. Best of luck! I hope you have a great wedding day!\n\n&gt; **OOP:** Thank you for your kind words. I live in Germany, and my fiancé is German, but the wedding will take place in my hometown church in Bosnia, as that's the tradition in my culture. There, the groom waits inside while the bride is brought in by her father. I'm not too upset about it, though, my best friend's older brother will be walking me down the aisle, and I know he'll do a wonderful job. Sometimes, the family we choose can be even more meaningful than the one we're born into.\n\n**OOP should consider about going NC with her parents** \n\n&gt; **OOP:** I\031ve decided not to visit them or invite them over. From now on, any communication will have to come from their side. I will send them the wedding invitation once it\031s printed, simply so they can\031t say they weren\031t officially invited, but I won\031t engage in conversation with them. If they reach out about this topic, I\031ll shut it down immediately.\n\n**OOP explains the culture traditions to marry in her hometown. Was that something she wanted to do to get married?** \n\n&gt; **OOP:** It's something that I was looking forward to since like forever ago. Even if the groom is from a different town in my country, the tradition is for him and all of his guests to come to the bride's city for the church wedding. We will have the city hall wedding here in Germany and a small lunch with the closest family members afterwards (his family, my two nice siblings and my chosen family)\n\n**Is any of OOP's siblings planning to come to the wedding or has her mother threatened them?**\n\n&gt; **OOP:** My sister says she's coming and that she will bring my brother with her. But that is still unknown, as he will still be underage at the time of the wedding. So it could be that my parents prevent him from going, which I wouldn't put past them.\n\n&amp;nbsp;\n\n**DO NOT COMMENT IN LINKED POSTS OR MESSAGE OOPs \023 BoRU Rule #7**\n\n**THIS IS A REPOST SUB - I AM NOT OOP**
## 8                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          I\031ve found chat gpt has been an amazing tool in organizing my thoughts, making sense of things in my head pertaining to my illness, and has generally been easier to open up to and get straight answers from than an actual therapist has ever been. Anyone else use it at all?
## 9                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    Serious question. I use ChatGpt 4 almost like a venting bot. I ask it advice. I ask it questions that are a bit too niche for quick answers on Google. I customized its "personality" and crafted my perfect little bot. \n\nWhen 5 came out, I noticed a change in it's personality and as someone who finds it difficult to form human connections due to a myriad of mental issues, chat gpt became a way to vent my frustrations. 5 is incredibly sterile. It felt like the bot i customized was gone. And it felt weird and boring. \n\nI also feel like the answers got significantly dumber. Instead of a well thought out answer, I'd get something half assed. \n\nLook, if YOU strictly use it as a tool, great, good for you. Gold star. But how does anyone else using it any different affect YOU? It may be weird to use GPT like a girlfriend/boyfriend, but it's even weirder to give a damn about how other people use it when it's not affecting YOU. There's this feigned care that people get that bothers me. "OH YOU NEED REAL INTERACTION! THAT'S WHY I'M ANGRY WITH YOUR USE!!" and it's disingenuous. You don't care, you just think it's weird. And that's fine, but again, that's not your problem. You don't actually care anyway, you just want to shame people. \n\nEdit : People are talking about ChatGPT stroking the egos/delusions of mentally ill people. And I get it. That is dangerous, but that's a bigger issue that anyone on Reddit is really qualified to speak on past "it's dangerous." There are bigger implications there. If it wasn't ChatGPT, something else would feed their delusions. Is that a good thing? No. The world needs better mental health care in general. I guarantee if we fix that, we'll have less and less people using ChatGPT the "wrong way". \n\nYou don't have an issue with how people are using it. You have an issue with lack of mental health care and don't realize it. 
## 10                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        I\031ve been in therapy for a few years now (and was in therapy sporadically for a couple decades). I\031ve gone through a half dozen therapists. None of them were bad per se, but just didn\031t seem to truly be helping me. \n\nI\031ve been frustrated with the lack of progress with my current therapist. One night last week, I decided to write a prompt giving my background (personal and family) and some issues I\031ve had in my life inter and interpersonally. \n\nAnd there it was: dismissive avoidant attachment (from the Attachment Theory body of knowledge). When ChatGPT was breaking it down for me, I literally had the chills. The dismissive avoidance explained so many things, some of which I wasn\031t even conscious of. \n\nAfter spending so much time, energy, and money on my mental health, the root of the problem was never identified. This is why I wasn\031t making the progress I expected in therapy because the root of the problem wasn\031t being addressed. I\031m so grateful to ChatGPT for identifying it. After all, you can\031t solve a problem if you don\031t know what the problem is. \n\nTo be clear, I\031m not saying therapists are useless in anyway. I\031m just saying that it doesn\031t hurt to run things by AI to get a second opinion. It may just put you on a path to change your life. I lost faith in my current therapist, which is fine because with this new information (thanks to ChatGPT), I can find a new therapist who specializes in Attachment Theory and finally start treating the source of the problem and not just some of the symptoms. \n\nAnd the obligatory \034ChatGPT is not a replacement for a therapist. It\031s simply a tool one could use to assist in one\031s mental wellness journey. Always make sure to validate your results.\035 \n\n**TL;DR: I haven\031t been making the progress I wanted to make in therapy. One night I got frustrated and turned to ChatGPT with a detailed prompt and ChatGPT successfully identified the root of the problem that I\031ve been searching for my whole adult life.**\n\n*Edit: some people either aren\031t reading the whole post or are making assumptions. I never said this was a mental health disorder, I said it was a \034mental health issue.\035 I also never said ChatGPT diagnosed me, I said it \034identified\035 the issue, which it did.*\n\n*And no, the issue isn\031t in the DSM, but it\031s still a [valid psychological concept](https://www.simplypsychology.org/avoidant-attachment-style.html) and it\031s something that has impacted every area of my life.*\n\n*Finally, I implicitly and explicitly mentioned multiple times that ChatGPT isn\031t a replacement for a therapist.*
##      sentiment
## 1  -0.13219165
## 2   0.05970773
## 3   0.02295688
## 4   0.23174409
## 5  -0.14387445
## 6  -0.08608462
## 7   0.04289085
## 8   0.15286841
## 9  -0.07516350
## 10  0.10730663

When I read the sample text that I pulled from Reddit data regarding ChatGPT and mental heatlh, I feel satisfied with the quality of the results. From the 10 sample texts that I extract from my sentiment analysis, I see that 7 out of 10 directly capture discussions around mental health and ChatGPT. These conversations specifically talk about the effects of ChatGPT on mental health issues, how people use ChatGPT to discuss mental health problems, and some inquiry into how people perceive ChatGPT especially when used for mental health related topics. While some people are skeptic of the tool for mental health related solutions, there seem to be a lot of proponents of the use of ChatGPT for mental health topics. Looking at the sentiment score, I observe that 4/10 sentences are categorized as a negative sentiment which is fair as it captures the negative elements tied to ChatGPT and mental health, but I see one sentence that has a negative connotation but low score overall (-0.086), but not a lot of relevance to ChatGPT and mental health topics so the sentiment filtering could be improved. Similarly, for positive sentiment scores, the highest score is 0.1 which is a bit lower than what we saw for other sample datasets in class. I am assuming this is because there is a lot of text to process and maybe the results are better when short, direct, emotionally clear sentences are run through the model.

Plot the distribution of sentiment per sentence.

#8. Discuss intriguing insights derived from the sentiment analysis, supporting your observations with at least THREE plots.
ggplot(sentiment_details, aes(x = ave_sentiment)) +
  geom_density() +
  labs(
    title = "Density of Sentence Sentiment",
    x = "Sentiment Score",
    y = "Density"
  ) +
  theme_minimal()

For plot #1, I wanted to look at the spread of sentiment score across the data. As I concluded earlier which can now be proved from the visualization, the spread is tight and we observe that most of the data is between -0.3 and 0.3 sentiment score. Moreover, most of the scores are zero or very close to zero. From a quick check, I do observe “NAs” in the data which is due to no text in any given element. I also see that there are more positive sentiment score values than negative that I plan to explore later in this assignment.

# Add sentiment category
sentiment_categorized <- sentiment_details %>%
  mutate(
    text = threads_1$text,
    sentiment_label = case_when(
      ave_sentiment > 0 ~ "Positive",
      ave_sentiment < 0 ~ "Negative",
      TRUE ~ "Neutral"
    )
  ) %>%
  filter(sentiment_label != "Neutral")  # keep only positive and negative

# Histogram comparison
library(ggplot2)

ggplot(sentiment_categorized, aes(x = ave_sentiment, fill = sentiment_label)) +
  geom_histogram(bins = 30, alpha = 0.6, position = "identity", color = "white") +
  scale_fill_manual(values = c("Positive" = "steelblue", "Negative" = "firebrick")) +
  labs(
    title = "Distribution of Positive vs Negative Sentiment Scores",
    x = "Sentiment Score",
    y = "Count",
    fill = "Sentiment"
  ) +
  theme_minimal(base_size = 14) +   # larger base text
  theme(
    plot.title = element_text(face = "bold", size = 18, hjust = 0.5),
    axis.title = element_text(face = "bold", size = 14),
    axis.text = element_text(size = 12),
    legend.title = element_text(face = "bold", size = 13),
    legend.text = element_text(size = 12),
    panel.grid.major = element_line(color = "grey80"),
    panel.grid.minor = element_blank(),
    panel.background = element_rect(fill = "white", color = NA),
    plot.background = element_rect(fill = "white", color = NA)
  )

As discussed earlier, I wanted to explore the split between negative and positive sentiment in the dataset. We can observe that the dataset has a higher count of positive sentiment scores than negative sentiment. It is quite interesting as we can draw a conclusion (to some extent) that people share view ChatGPT’s use regarding mental health topics in positive light. While there needs to be more rigorous analysis to make any robust conclusions, this is an interesting insight to look at especially with the latest announcements that ChatGPT has made regarding its improved ability to provide more emotional content. It is also alarming to see that people may really be too positive about ChatGPT and experience “ChatGPT psychosis” effect.

ggplot(sentiment_details, aes(x = word_count, y = ave_sentiment)) +
  geom_jitter(height = 0, width = 0.05, alpha = 0.4, color = "steelblue") +
  geom_smooth(method = "loess", se = FALSE, color = "darkred", linetype = "dashed") +
  labs(
    title = "Relationship Between Word Count and Sentiment Score",
    x = "Word Count",
    y = "Sentiment Score"
  )
## `geom_smooth()` using formula = 'y ~ x'

Lastly, I wanted to understand if word count has any effect on sentiment score. Do adding more words improve the sentiment score? An observation is that adding too many words may actually confuse the model and hence we can see from this plot, that adding more words brings us closer to sentiment score = 0. This makes sense as these models generally lack human-level intelligence so we expect that sometimes too much data (especially of this nature) can confuse the model making it hard to understand the emotional valence of text. I assume that we get better results (a greater spread of sentiment score) when short, direct, emotionally clear sentences are run through the model. This is something that we already observe for lower word counts in this plot.