Skip to content

Instantly share code, notes, and snippets.

View emitanaka's full-sized avatar

Emi Tanaka emitanaka

View GitHub Profile
@emitanaka
emitanaka / buggy_slide_with_fix.Rmd
Created September 11, 2019 21:30
xaringan ninjutsu remark.js bug
---
output:
xaringan::moon_reader:
css: "ninjutsu"
seal: false
---
class: split-40
count: false
@emitanaka
emitanaka / example.html
Created September 11, 2019 22:08
remark.js bug - unclosed square bracket
<!DOCTYPE html>
<html xmlns="http://www.w3.org/1999/xhtml" lang="" xml:lang="">
<head>
<meta charset="utf-8" />
<style>
.column1, .column2 {
position: absolute;
top:0;
width:50%;
}
@emitanaka
emitanaka / animate-voting.R
Last active April 30, 2020 01:46
Instant-runoff voting system for the 🇦🇺 House of Representative election in 2019
# the party logos are required to be in the form of `plogo-XXX.png` where XXX is the party abbreviation that matches
# in PartyAb
# inspired by https://coolbutuseless.github.io/2020/04/12/racing-barplots-with-ggpattern-flagon-gganimate/
library(tidyverse)
library(gganimate)
library(ggpattern)
dat <- read_csv("https://results.aec.gov.au/24310/Website/Downloads/HouseDopByDivisionDownload-24310.csv", skip = 1) %>%
mutate(PartyAb = case_when(
@emitanaka
emitanaka / median-income-calc.R
Last active June 11, 2020 03:22
Median income calculation from range
library(tidyverse)
income_df <- tibble(income_range = c("0-74", "75-145", "150-325", "325+"),
count = c(125, 170, 215, 250)) %>%
separate(income_range,
into = c("income_min", "income_max"),
convert = TRUE)
calc_median_income <- function(df) {
df %>%
as_tidymatrix <- function(x){
structure(list(.value = as.vector(x),
.row = as.vector(row(x)),
.col = as.vector(col(x))),
row.names = seq_len(length(as.vector(x))),
nrow = nrow(x), # need these attribute if storing it as sparse later
ncol = ncol(x),
class = c("tidymatrix", "data.frame"))
}
@emitanaka
emitanaka / patch-preserving-attributes-with-c.R
Last active April 18, 2021 09:40
Combine elements like `c` but preserving the attributes
x <- structure(list(x = 1), "attr" = 2)
y <- structure(list(y = 3), "attr" = 1)
l <- list(x, y)
out <- do.call(c, l)
# doesn't quite work (notice the name)
out2 <- lapply(seq_along(out), function(i) {
attributes(out[[i]]) <- attributes(l[[i]])
out[[i]]
})
library(data.table)
library(tidyverse) # ggplot2, tidyr, dplyr, purrr, stringr ...
library(scales)
library(grid)
library(RColorBrewer)
###############################################################
## MOST COMMON ACTIONS DURING FIRST TWO WEEKS
###############################################################
## IMPORT AND TIDY DATA