Skip to content

rstudio/spark.rstudio.com

Repository files navigation

Official sparklyr website

https://spark.posit.co/

To update the packages' documentation run:

library(glue)
library(fs)

build_reference <- function(pkg, org, sub = NULL, readme = TRUE) {
  clone <- path("_packages", pkg)
  if(is.null(sub)) {
    target <- path("packages", pkg)
  } else {
    target <- path("packages", pkg, sub)
  }
  repo_url <- glue("https://github.com/{org}/{pkg}")
  if(dir_exists(clone)) {
    system2("git", paste0("-C '", path_abs(clone), "' pull ", repo_url, " -q"))
  } else {
    gert::git_clone(repo_url, path = clone)  
  }
  pkgsite::write_reference(
    project = clone, 
    folder = path(target, "reference"), 
    examples = FALSE
  )
  file_copy(path(clone, "NEWS.md"), path(target, "news.md"), overwrite = TRUE)  
  if(readme) {
    file_copy(path(clone, "README.md"), path(target, "index.md"), overwrite = TRUE)    
  }
}

build_reference("sparklyr", "sparklyr", "latest", FALSE)
build_reference("pysparklyr", "mlverse")
build_reference("sparkxgb", "rstudio")
build_reference("sparktf", "rstudio")
build_reference("mleap", "rstudio")
build_reference("graphframes", "rstudio")

About

Official repo for:

Resources

Stars

Watchers

Forks

Releases

No releases published

Packages

No packages published

Contributors 24