Skip to content

Instantly share code, notes, and snippets.

@tylermorganwall
tylermorganwall / ortho_example.R
Created October 7, 2019 12:18
rayrender orthographic projection example
library(rayrender)
#Create base scene
basescene = xz_rect(x=555/2,y=0.1,z=555/2,555,555,
material = lambertian(color="#bababa", checkercolor = "grey10", checkerperiod = 100)) %>%
add_object(xz_rect(x=555/2,y=1000,z=555/2,343,332,
material = lambertian(color="white", lightintensity=40,implicit_sample = TRUE),
flipped=TRUE))
#Function for sphere bouncing
@tylermorganwall
tylermorganwall / masterclass_precheck.R
Last active November 17, 2019 13:54
Run this script to make sure your system is ready to run rayshader
options(rgl.useNULL = FALSE)
install.packages(c("ggplot2","raster", "spatstat", "spatstat.utils","suncalc", "remotes",
"here", "sp","lubridate","rgdal", "magick", "av","xml2","rayrender"))
install.packages("whitebox", repos="http://R-Forge.R-project.org")
library(whitebox)
whitebox::wbt_init()
#macOS: xcrun issue? type "xcode-select --install" into terminal
#macOS imager.so or libx11 errors? Install X11: https://www.xquartz.org
@tylermorganwall
tylermorganwall / ripple.R
Created November 22, 2019 12:35
Pathtraced ripple effect in R with rayshader/rayrender
library(rayshader)
wave = matrix(0,200,200)
for(t in seq(1,360,1)) {
for(i in 1:200) {
for(j in 1:200) {
wave[i,j] = 50*sinpi(sqrt((i-100)^2 + (j-100)^2)/30-t/180) * exp(-(sqrt((i-100)^2 + (j-100)^2))/100)
}
}
wave %>% height_shade() %>% plot_3d(wave, soliddepth = -50, shadowdepth = -70, theta=315,zoom=1.1)
@tylermorganwall
tylermorganwall / pennsylvania_rayshader_example.R
Last active March 26, 2024 13:54
30 Day Map Challenge, Day 30: Home (Pennsylvania)
library(rayshader)
library(raster)
library(stringr)
library(sp)
library(maptools)
library(dplyr)
library(rgdal)
library(sf)
readShapePoly("eastern-states")
@tylermorganwall
tylermorganwall / shanghai_ring_hdr.R
Last active December 4, 2019 13:46
A simple animation with a scene lit by an HDR environment image (from hrdihaven.com)
library(rayrender)
vecx = 10 * sinpi(1:360/180)
vecz = 10 * cospi(1:360/180)
anglevec = -10 * cospi(1:360/90)
for(i in seq(1,360,by=1)) {
generate_ground(material = dielectric()) %>%
add_object(sphere(material = metal())) %>%
add_object(disk(radius=3, inner_radius = 2, angle = c(anglevec[i],-i,0))) %>%
@tylermorganwall
tylermorganwall / spiral.R
Created December 6, 2019 14:02
Rendering a light traveling through a spiral
library(rayrender)
drawspiral = function(n, x = 0, material=diffuse(color="white")) {
segments = list()
for(i in seq_len(n)) {
if(i %% 2 != 0) {
segments[[i]] = cylinder(z=0.5,x=x, length=0.5, radius=0.5*i, material = material, phi_min = 90, phi_max = 270)
} else {
segments[[i]] = cylinder(z=0,x=x, length=0.5, radius=0.5*i, material = material, phi_min = 90, phi_max = 270, angle=c(0,180,0))
}
@tylermorganwall
tylermorganwall / pillars.R
Created February 13, 2020 12:48
3D pathtraced oscillating pillars in R
library(rayshader)
library(rayrender)
for(t in 1:90) {
sliced = matrix(10, 99, 99)
sliced2 = sliced
for(i in 1:nrow(sliced)) {
for(j in 1:ncol(sliced)) {
sliced2[i,j] = 10+1*cos(-t/90*2*pi + 8*i/nrow(sliced))
if(i %% 3 == 0 || j %% 3 == 0) {
@tylermorganwall
tylermorganwall / 3d_jealous_girlfriend.R
Last active April 25, 2020 20:25
3D jealous girlfriend ggplot made with R + rayshader
library(tidyverse)
dbf = data.frame(color=character(0), x=numeric(0), y=numeric(0), stringsAsFactors = F)
## Distractive woman
# Left arm
dbf = bind_rows(dbf, crossing(color='skin', x=seq(4,5), y=seq(1,9),z=3))
dbf = bind_rows(dbf, data.frame(color='skin', x=5, y=10,z=3))
@tylermorganwall
tylermorganwall / advanced_3d_pie_chart.R
Created June 28, 2020 14:48
The Most Beautiful 3D Pie Charts You've Ever Seen
library(rayrender)
pielist = list()
counter = 1
for(i in seq(60-90,360-90,by=60)) {
angles = seq(i-60,i,by=1)
xx = 2*sinpi(angles/180)
yy = 2*cospi(angles/180)
pielist[[counter]] = data.frame(x=c(0,xx),y=c(0,yy))
counter = counter + 1
@tylermorganwall
tylermorganwall / covidcases3D.R
Created June 29, 2020 03:18
State New Cases COVID-19 3D Visualization in R
library(rayrender)
library(sf)
library(dplyr)
library(ggplot2)
library(lubridate)
library(magick)
#Extract state data
us_states = spData::us_states