library(readxl)
library(ggplot2)
library(forcats)
library(patchwork)
job <- read_excel("job posting.xlsx")
job |>
ggplot(aes(x = fct_reorder(Country, Stat),
y = Stat,
fill = Country)) +
geom_col() +
geom_text(vjust = 0.5,
hjust = 1.2,
size = 4,
label = job$Stat) +
labs(x = "Country",
y = " ") +
coord_flip() +
theme_classic() +
theme(legend.position = "none") +
ggtitle("Number of Job Postings for Statisticians as of Sept 2022")
library(readxl)
library(ggplot2)
library(forcats)
library(patchwork)
job <- read_excel("job posting.xlsx")
job |>
ggplot(aes(x = fct_reorder(Country, DS),
y = DS,
fill = Country)) +
geom_col() +
geom_text(vjust = 0.5,
hjust = 1.2,
size = 4,
label = job$DS) +
labs(x = "Country",
y = " ") +
coord_flip() +
theme_classic() +
theme(legend.position = "none") +
ggtitle("Number of Job Postings for Data Scientists as of Sept 2022")
library(gapminder)
library(gganimate)
ggplot(gapminder, aes(gdpPercap, lifeExp, size = pop, colour = country)) +
geom_point(alpha = 0.7, show.legend = FALSE) +
scale_colour_manual(values = country_colors) +
scale_size(range = c(2, 12)) +
scale_x_log10() +
facet_wrap(~continent) +
labs(title = 'Year: {frame_time}', x = '', y = 'Life expectancy') +
ggtitle("GDP per capita of Countries: 1952-2007") +
transition_time(year) +
ease_aes('linear')
Kalita, JK, Bhattacharyya, JK, and Roy, S (2023). Fundamentals of Data Science: Theory and Practice. Academic Press.
R Core Team (2024). R: A Language and Environment for Statistical Computing. R Foundation for Statistical Computing, Vienna, Austria. https://www.R-project.org/
Posit team (2023). RStudio: Integrated Development Environment for R. Posit Software, PBC, Boston, MA. URL http://www.posit.co/
https://psa.gov.ph/infographics?field_sector_value=Labor%20and%20Employment&page=1
https://quarto.org/docs/presentations/revealjs/
https://github.com/gadenbuie/xaringanthemer
https://github.com/chris-allones/RTalks/blob/main/dbm-special-lecture-2024/index.qmd
https://www.shutterstock.com/image-vector/futuristic-big-data-technology-concept-art-1044083485
https://www.linkedin.com/jobs/
https://www.jobstreet.com.ph/statistician-jobs
https://psa.gov.ph/career
Regional Data Festival: Visayas Cluster | 28 - 29 October 2024