Ecosyste.ms: Awesome
An open API service indexing awesome lists of open source software.
https://github.com/rstudio/hex-stickers
RStudio hex stickers
https://github.com/rstudio/hex-stickers
hex-stickers r rstudio
Last synced: 6 days ago
JSON representation
RStudio hex stickers
- Host: GitHub
- URL: https://github.com/rstudio/hex-stickers
- Owner: rstudio
- License: cc0-1.0
- Created: 2018-03-27T18:05:42.000Z (almost 7 years ago)
- Default Branch: main
- Last Pushed: 2024-12-14T21:38:52.000Z (28 days ago)
- Last Synced: 2024-12-30T04:03:10.852Z (13 days ago)
- Topics: hex-stickers, r, rstudio
- Language: R
- Homepage:
- Size: 151 MB
- Stars: 471
- Watchers: 85
- Forks: 131
- Open Issues: 7
-
Metadata Files:
- Readme: README.Rmd
- Contributing: .github/contributing.md
- License: LICENSE.md
Awesome Lists containing this project
- jimsghstars - rstudio/hex-stickers - RStudio hex stickers (R)
README
---
output: github_document
---# RStudio hex stickers
Want to buy a sticker? Many can be purchased from
. Or [see our instructions](#printing)
on how to print them yourself.```{r, echo = FALSE, message = FALSE}
library(magick)
logos <- tools::file_path_sans_ext(dir("PNG", pattern = "\\.png$"))
png <- paste0("PNG/", logos, ".png")
svg <- paste0("SVG/", logos, ".svg")
thumb <- paste0("thumbs/", logos, ".png")resize <- function(path_in, path_out) {
image <- image_read(path_in)
image <- image_resize(image, "278x")
image_write(image, path_out)
}outdated <- !file.exists(thumb) | file.mtime(thumb) < file.mtime(png)
invisible(Map(resize, png[outdated], thumb[outdated]))
``````{r, results = "asis", echo = FALSE}
img <- glue::glue('')
png_link <- glue::glue('{logos}.png')
svg_link <- glue::glue('{logos}.svg')
cell <- paste0("", img, "
", png_link, "
", svg_link, "")cols <- 5
rows <- ceiling(length(cell) / cols)row_id <- rep(seq_len(rows), each = cols, length.out = length(cell))
row_cells <- split(cell, row_id)cat("\n")
cat(paste0("", sapply(row_cells, paste, collapse = ""), ""), sep = "")
cat("\n")
```All stickers are licensed [CC0](LICENSE.md).
## Printing
Look for a company that offers die-cut stickers. We recommend using the PNG version of the sticker. The printed stickers should be 1.74" x 2".
If you use the SVG version:
* Specify colors as CMYK using the U.S. Web Coated (SWOP) v2 profile.
* Save a copy of your final sticker and convert all text to outlines to avoid font problems.