library(tidyverse)
## ── Attaching packages ─────────────────────────────────────────────────────────── tidyverse 1.3.0 ──
## ✓ ggplot2 3.2.1 ✓ purrr 0.3.3
## ✓ tibble 2.1.3 ✓ dplyr 0.8.3
## ✓ tidyr 1.0.0 ✓ stringr 1.4.0
## ✓ readr 1.3.1 ✓ forcats 0.4.0
## ── Conflicts ────────────────────────────────────────────────────────────── tidyverse_conflicts() ──
## x dplyr::filter() masks stats::filter()
## x dplyr::lag() masks stats::lag()
library(igraph)
##
## Attaching package: 'igraph'
## The following objects are masked from 'package:dplyr':
##
## as_data_frame, groups, union
## The following objects are masked from 'package:purrr':
##
## compose, simplify
## The following object is masked from 'package:tidyr':
##
## crossing
## The following object is masked from 'package:tibble':
##
## as_data_frame
## The following objects are masked from 'package:stats':
##
## decompose, spectrum
## The following object is masked from 'package:base':
##
## union
library(visNetwork)
library(DT)
library(plotly)
##
## Attaching package: 'plotly'
## The following object is masked from 'package:igraph':
##
## groups
## The following object is masked from 'package:ggplot2':
##
## last_plot
## The following object is masked from 'package:stats':
##
## filter
## The following object is masked from 'package:graphics':
##
## layout
library(readxl)
self_esteem <- read_csv("Survey Project R3 (Responses) - Form Responses 1.csv")
## Parsed with column specification:
## cols(
## Timestamp = col_character(),
## `On a general day to day basis, about how much time do you spend on social media?` = col_character(),
## `Social media impacts your self esteem by...` = col_character(),
## `I feel that I am a person of worth, at least on an equal plane with others.` = col_character(),
## `I feel that I have a number of good qualities.` = col_character(),
## `All in all, I am inclined to feel that I am a failure.` = col_character(),
## `I am able to do things as well as most other people.` = col_character(),
## `I feel I do not have much to be proud of.` = col_character(),
## `I take a positive attitude toward myself.` = col_character(),
## `On the whole, I am satisfied with myself.` = col_character(),
## `I wish I could have more respect for myself.` = col_character(),
## `I certainly feel useless at times.` = col_character(),
## `At times I think I am no good at all.` = col_character()
## )
glimpse(self_esteem)
## Observations: 17
## Variables: 13
## $ Timestamp <chr> …
## $ `On a general day to day basis, about how much time do you spend on social media?` <chr> …
## $ `Social media impacts your self esteem by...` <chr> …
## $ `I feel that I am a person of worth, at least on an equal plane with others.` <chr> …
## $ `I feel that I have a number of good qualities.` <chr> …
## $ `All in all, I am inclined to feel that I am a failure.` <chr> …
## $ `I am able to do things as well as most other people.` <chr> …
## $ `I feel I do not have much to be proud of.` <chr> …
## $ `I take a positive attitude toward myself.` <chr> …
## $ `On the whole, I am satisfied with myself.` <chr> …
## $ `I wish I could have more respect for myself.` <chr> …
## $ `I certainly feel useless at times.` <chr> …
## $ `At times I think I am no good at all.` <chr> …
self_esteem <- self_esteem %>%
rename(hours = `On a general day to day basis, about how much time do you spend on social media?`) %>%
rename(impact = `Social media impacts your self esteem by...`) %>%
rename(worthiness = `I feel that I am a person of worth, at least on an equal plane with others.`) %>%
rename(qualities = `I feel that I have a number of good qualities.`) %>%
rename(failure = `All in all, I am inclined to feel that I am a failure.`) %>%
rename(competence = `I am able to do things as well as most other people.`) %>%
rename(pride = `I feel I do not have much to be proud of.`) %>%
rename(positivity = `I take a positive attitude toward myself.`) %>%
rename(satisfaction = `On the whole, I am satisfied with myself.`) %>%
rename(respect = `I wish I could have more respect for myself.`) %>%
rename(uselessness = `I certainly feel useless at times.`) %>%
rename(value = `At times I think I am no good at all.`)
“On a general day to day basis, about how much time do you spend on social media?”
self_esteem %>%
plot_ly(x = ~hours) %>%
add_histogram()
“Social media impacts your self esteem by…”
self_esteem %>%
plot_ly(x = ~impact) %>%
add_histogram()
“I feel that I am a person of worth, at least on an equal plane with others.”
self_esteem %>%
plot_ly(x = ~worthiness) %>%
add_histogram()
“I feel that I have a number of good qualities.”
self_esteem %>%
plot_ly(x = ~qualities) %>%
add_histogram()
“All in all, I am inclined to feel that I am a failure.”
self_esteem %>%
plot_ly(x = ~failure) %>%
add_histogram()
“I am able to do things as well as most other people.”
self_esteem %>%
plot_ly(x = ~competence) %>%
add_histogram()
“I feel I do not have much to be proud of.”
self_esteem %>%
plot_ly(x = ~pride) %>%
add_histogram()
“I take a positive attitude toward myself.”
self_esteem %>%
plot_ly(x = ~positivity) %>%
add_histogram()
“I take a positive attitude toward myself.”
self_esteem %>%
plot_ly(x = ~satisfaction) %>%
add_histogram()
“I wish I could have more respect for myself.”
self_esteem %>%
plot_ly(x = ~respect) %>%
add_histogram()
“I certainly feel useless at times.”
self_esteem %>%
plot_ly(x = ~uselessness) %>%
add_histogram()
“At times I think I am no good at all.”
self_esteem %>%
plot_ly(x = ~value) %>%
add_histogram()
self_esteem %>%
drop_na(impact) %>%
ggplot(aes(x = impact)) +
geom_bar() +
facet_wrap(vars(hours)) +
coord_flip() +
theme_minimal() +
labs(y = "How much time do you spend on social media per day?",
x = "Impact social media has on you.",
title = "Time vs. Impact of Social Media")
As you can see above, those who used social media for less than one hour a day only responded with “Does not impact my self-esteem.” Another interesting point, those who spent 4-6 hours a day on social media answered equally for “lowering my self-esteem,” as well as for “increases my self-esteem.” Due to the high volume of people that answered “does not impact my self-esteem,” it is likely that screen time may not play a huge role in self-esteem.
self_esteem %>%
drop_na(hours) %>%
ggplot(aes(x = hours)) +
geom_bar() +
facet_wrap(vars(worthiness)) +
coord_flip() +
theme_minimal() +
labs(y = "How worthy do you feel as a person?",
x = "Hours spent on social media.",
title = "Time on socil media vs. Level of Self Worth")
“I feel that I am a person of worth, at least on an equal plane with others,” was the question posed for this graph. This question also happened to have one of the widest arrays of answers. Though the majority of people answered “agree” or “strongly agree,” it is still important to note that the only people who voted on the disagree spectrum spent 1-3, or 4-6 hours a day on social media. Correlation does not imply causation, but I think it is an important thing to notice that as hours go up, more negative responses occur.