Welcome to my Shiny App pitch!
This app is built around the Palmer Penguins dataset.
We’ll visualize how penguin body mass varies by species and sex using interactive charts.
Welcome to my Shiny App pitch!
This app is built around the Palmer Penguins dataset.
We’ll visualize how penguin body mass varies by species and sex using interactive charts.
The app uses the palmerpenguins
dataset.
library(palmerpenguins) library(dplyr) head(penguins)
## # A tibble: 6 × 8 ## species island bill_length_mm bill_depth_mm flipper_length_mm body_mass_g ## <fct> <fct> <dbl> <dbl> <int> <int> ## 1 Adelie Torgersen 39.1 18.7 181 3750 ## 2 Adelie Torgersen 39.5 17.4 186 3800 ## 3 Adelie Torgersen 40.3 18 195 3250 ## 4 Adelie Torgersen NA NA NA NA ## 5 Adelie Torgersen 36.7 19.3 193 3450 ## 6 Adelie Torgersen 39.3 20.6 190 3650 ## # ℹ 2 more variables: sex <fct>, year <int>
We focus on the body_mass_g
, sex
, and species
variables for visual comparison.
The app includes:
names(penguins)
## [1] "species" "island" "bill_length_mm" ## [4] "bill_depth_mm" "flipper_length_mm" "body_mass_g" ## [7] "sex" "year"
User input dynamically updates the histogram grouping and display.
Here’s a preview of the interactive Plotly histogram grouped by sex
:
library(plotly)
## Warning: package 'plotly' was built under R version 4.4.3
## Warning: package 'ggplot2' was built under R version 4.4.3
penguins %>% filter(!is.na(sex), !is.na(body_mass_g)) %>% plot_ly( x = ~body_mass_g, color = ~sex, type = "histogram", nbinsx = 25 ) %>% layout(title = "Distribution of Penguin Body Mass by Sex")
✅ Built using Shiny + Plotly
✅ Dataset: palmerpenguins
✅ Hosted via RStudio’s Shiny Server
The source code and app are shared on GitHub as required.
Thank you for reviewing my submission!