diff --git a/NEWS.md b/NEWS.md index 7d29f3f3..a4df2350 100644 --- a/NEWS.md +++ b/NEWS.md @@ -3,7 +3,11 @@ * Fixes #956, allowing a port to be specified as an environment variable. User-provided ports must be between 1024 and 49151 (following [IANA guidelines](https://www.iana.org/assignments/service-names-port-numbers/service-names-port-numbers.xhtml)) and may not be a known unsafe port. plumber will now throw an error if an invalid port is requested. (@shikokuchuo @gadenbuie #963) * Added support for graphic devices provided by ragg and svglite (@thomasp85 #964) + * `parse_rds()`, `parse_feather()`, and `parse_parquet()` no longer writes data to disk during parsing (@thomasp85, #942) + +* Fixed a bug where setting the `apiPath` option wouldn't be honored when running the app (@thomasp85, #836) + * Returning error messages are now turned off by default rather than being turned on if running interactively and turned off if not (@thomasp85, #962) * New serializers diff --git a/R/plumber.R b/R/plumber.R index eed20aef..3409ac88 100644 --- a/R/plumber.R +++ b/R/plumber.R @@ -253,7 +253,6 @@ Plumber <- R6Class( old_wd <- setwd(dirname(private$filename)) on.exit({setwd(old_wd)}, add = TRUE) } - if (isTRUE(docs_info$enabled)) { mount_docs( pr = self, @@ -263,7 +262,7 @@ Plumber <- R6Class( callback = swaggerCallback, quiet = quiet ) - on.exit(unmount_docs(self, docs_info), add = TRUE) + #on.exit(unmount_docs(self, docs_info), add = TRUE) } if (!isTRUE(quiet) && inform_debug && rlang::is_interactive()) { diff --git a/R/ui.R b/R/ui.R index 18e6c2b9..cc9b5609 100644 --- a/R/ui.R +++ b/R/ui.R @@ -117,7 +117,8 @@ mount_openapi <- function(pr, api_url) { break } } - pr$handle("GET", "/openapi.json", openapi_fun, serializer = serializer_unboxed_json()) + path <- get_option_or_env("plumber.apiPath", "") + pr$handle("GET", paste0(path, "/openapi.json"), openapi_fun, serializer = serializer_unboxed_json()) invisible() } @@ -184,7 +185,7 @@ register_docs <- function(name, index, static = NULL) { stopifnot(is.function(index)) if (!is.null(static)) stopifnot(is.function(static)) - docs_root <- paste0("/__docs__/") + docs_root <- "/__docs__/" docs_paths <- c("/index.html", "/") mount_docs_func <- function(pr, api_url, ...) { # Save initial extra argument values @@ -210,8 +211,11 @@ register_docs <- function(name, index, static = NULL) { message("Overwritting existing `", docs_root, "` mount") message("") } - - pr$mount(docs_root, docs_router) + + pr$mount( + paste0(get_option_or_env("plumber.apiPath", ""), docs_root), + docs_router + ) # add legacy swagger redirects (RStudio Connect) redirect_info <- swagger_redirects()