When trying to run a shiny app I get: Warning: Error in installlibrary: could not find function "installlibrary"

...When trying to run a shiny app I get: Warning: Error in installlibrary: could not find function "installlibrary"

Welcome to the community @pbojczuk! Did you mean to just use library()? If not, can you please share that section of code to help further troubleshoot?

library("tidyverse")
library("WDI")
library("leaflet")
library("sf")
library("rnaturalearthdata")

source("data-processing.R", local = TRUE)

function(input, output, session) {
updateSelectInput(session,
"selected_continent",
choices = unique(countries$continent)
)

observeEvent(input$selected_continent, {
countries_in_continent <- countries %>%
filter(continent == input$selected_continent)

I don't see installlibary in this code. Is it possibly in the "data-processing.R" script?

Thank you for getting back! I think this is what you were referring to. Many Thanks UI.r

installlibrary("shinycustomloader")
library("leaflet")

navbarPage(
"What is Shiny?",
tabPanel(
"World Bank Indicator Dataviz",
fluidPage(
wellPanel(
h4("What is this?"),
p("This is an example Shiny app that visualises data from the World Data Bank using the WDI package."),
p("The controls you can see are written in R code and the visualisations that are displayed are written in R. The entire interface and behaviour of the web application is written in R, using the Shiny package.")
),
div(
fluidRow(
column(
selectInput("selected_continent",
"Select a continent",
choices = NULL
),
width = 3
),
column(
selectInput("selected_country",
"Select a country",
choices = NULL
),
width = 4
),
column(
selectInput("selected_indicator",
"Select an indicator",
choices = NULL,
width = "100%"
),
width = 5
)
),
style = "position:relative;z-index:10000;"
)
),
actionButton("update_chart",
"Update Chart",
width = "100%"
),
hr(),
fluidRow(
column(
withLoader(leafletOutput("highlighted_world_map"), loader = "dnaspin"),
width = 6
),
column(
withLoader(plotOutput("wdi_indicator_chart"), loader = "dnaspin"),
width = 6
)
)
),
collapsible = TRUE
)

1 Like

This should probably be

library("shinycustomloader")

rather than

installlibrary("shinycustomloader")

This topic was automatically closed 54 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.