Error: C stack usage 23744748 is too close to the limit

Hello everyone!

I'm having trouble trying to learn how to draw 3D charts.

I execute the commands as directed by this site "https://typethepipe.com/post/ggplot-to-3d-in-r-with-rayshader/"

And when I run the code below, I get an error like " Error: C stack usage 23744748 is too close to the limit"

I don't know where the error is and how can I fix it. Please help me out. I hope someone can show me how to fix it simply with some pictures. I am extremely grateful.

The code I ran and got stuck:

library(pxR)
library(RColorBrewer)
library(rgeos)
#install.packages("rgdal", repos = "http://cran.us.r-project.org") reinstall cause gpclib dependencie https://stackoverflow.com/questions/30790036/error-istruegpclibpermitstatus-is-not -true
library(rgdal)
library(rayshader)
library(knitr)
library(magrittr)
library(tidyverse)

as.numeric.factor <- function(x) { # Custom function to convert fctr to num factor value
    return(suppressWarnings(as.numeric(levels(x))[x]))
}
 
if(!dir.exists("data")) dir.create("data") # Create the download directory
utils::download.file(url = "http://www.ine.es/pcaxisdl/t20/e245/p05/a2018/l0/00000006.px",
                     destfile = "data/census_2018.px")
Cstack_info()
tbl_census_2018 <- read.px("data/census_2018.px") %>% as_tibble() # Load & format

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.