Mentions of sexism and men on nike post

These tables describe data from the Nike post advertising their new uniforms for the summer Olympics. We can see from the tables that everyone who commented mentioned sexism or inequality. We can also see there was heavy discourse on men in general.

Mentions of Sexism
Topic Count Percent
0 5479 100
Mentions of Men
Topic Count Percent
0 3193 58.3
1 2286 41.7
Code:
# Load packages

if (!require("tidyverse")) install.packages("tidyverse")
if (!require("tidytext")) install.packages("tidytext")
if (!require("plotly")) install.packages("plotly")
if (!require("gtExtras")) install.packages("gtExtras")

library(tidyverse)
library(tidytext)
library(gtExtras) 
library(plotly)
library(lubridate)

# Read the data

mydata <- read.csv("https://raw.githubusercontent.com/drkblake/Data/main/NikeUniforms.csv")



tidy_text <- mydata %>% 
  unnest_tokens(word,Full.Text) %>% 
  count(word, sort = TRUE)

# Deleting standard stop words

data("stop_words")
tidy_text <- tidy_text %>%
  anti_join(stop_words)

# Deleting custom stop words

my_stopwords <- tibble(word = c("https",
                                "t.co",
                                "rt"))
tidy_text <- tidy_text %>% 
  anti_join(my_stopwords)

head(tidy_text, 25)

searchterms <- "sexi |bigot |inequality"

mydata$Topic <- ifelse(grepl(searchterms,
                             mydata$Full.Text,
                             ignore.case = TRUE),1,0)
Topic <- mydata %>%
  group_by(Topic) %>%
  summarize(
    Count = n(),
    Percent = round(n() / nrow(mydata) * 100, 1)
  )

TopicTable <- gt(Topic) %>% 
  tab_header("Mentions of the topic") %>%
  cols_align(align = "left") %>%
  gt_theme_538

TopicTable


searchterms <- "guy |boy |men|male "

mydata$Topic <- ifelse(grepl(searchterms,
                             mydata$Full.Text,
                             ignore.case = TRUE),1,0)
Topic <- mydata %>%
  group_by(Topic) %>%
  summarize(
    Count = n(),
    Percent = round(n() / nrow(mydata) * 100, 1)
  )

TopicTable <- gt(Topic) %>% 
  tab_header("Mentions of the topic") %>%
  cols_align(align = "left") %>%
  gt_theme_538

TopicTable