Skip to content

Commit d855468

Browse files
authored
chore: inst/shiny -> inst/examples-shiny (#4003)
1 parent b8efd88 commit d855468

File tree

35 files changed

+1
-1
lines changed

35 files changed

+1
-1
lines changed

R/runapp.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -468,7 +468,7 @@ runExample <- function(example=NA,
468468
host=getOption('shiny.host', '127.0.0.1'),
469469
display.mode=c("auto", "normal", "showcase")) {
470470
legacy <- getOption('shiny.legacy.examples', FALSE)
471-
examplesDir <- if (isTRUE(legacy)) 'examples' else 'shiny'
471+
examplesDir <- if (isTRUE(legacy)) 'examples' else 'examples-shiny'
472472
examplesDir <- system_file(examplesDir, package='shiny')
473473
dir <- resolve(examplesDir, example)
474474
if (is.null(dir)) {
File renamed without changes.
File renamed without changes.
File renamed without changes.
File renamed without changes.
File renamed without changes.
File renamed without changes.
File renamed without changes.
File renamed without changes.
File renamed without changes.
File renamed without changes.
File renamed without changes.
File renamed without changes.
File renamed without changes.

0 commit comments

Comments
 (0)