CORDS_BY_WORD <- here("analyses/13_thompson_analyses/data/thompson_wiki_word_coordinates.csv")
tsne_dims <- read_csv(CORDS_BY_WORD) %>%
mutate(source = fct_relevel(source, "TRL"))
ggplot(tsne_dims, aes(x = tsne_X, y = tsne_Y, color = source, alpha = source)) +
#scale_color_continuous(low = "white", high = "red") +
scale_color_manual(values = c("red", "grey")) +
scale_alpha_manual(values = c(.9, .05))+
geom_point() +
theme_void()

ggplot(tsne_dims, aes(x = tsne_X, y = tsne_Y, color = source)) +
stat_density_2d(aes(fill = ..level..)) +
scale_fill_continuous(type = "viridis") +
theme_void()

ggplot(tsne_dims, aes(x = tsne_X, y = tsne_Y)) +
geom_hex(bins = 45) +
facet_wrap(~source)+
scale_fill_distiller(palette=3, direction=1) +
theme_void() +
theme(legend.position = "bottom")
