Unable to Connect to Leaflet Map

Trying to complete my first Shiny app deployment, but keep getting this error message:

Unable to connect to worker after 60.00 seconds; startup took too long.

Here is my code. It says everything is operational but nothing appears at: https://dszakonyi.shinyapps.io/LandRegistry/

When I reload the website, I get this error, even though I haven't assigned any tasks.

Error in value[3L] : HTTP 409
POST https://api.shinyapps.io/v1/applications/967148/deploy
Unable to dispatch task for application=967148, there are 1 tasks in progress
Calls: local ... tryCatch -> tryCatchList -> tryCatchOne ->
Execution halted

Thanks for your help!

R version 3.5.1 (2018-07-02) -- "Feather Spray"
Copyright (C) 2018 The R Foundation for Statistical Computing
Platform: x86_64-apple-darwin15.6.0 (64-bit)

R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.

  Natural language support but running in an English locale

R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.

Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.

Loading required package: sp
> library(shiny)
> library(leaflet)
> library(rsconnect)

Attaching package: ‘rsconnect’

The following object is masked from ‘package:shiny’:

    serverInfo

Warning message:
package ‘rsconnect’ was built under R version 3.5.2 

> 
> ###
> library(rgdal)
rgdal: version: 1.3-6, (SVN revision 773)
 Geospatial Data Abstraction Library extensions to R successfully loaded
 Loaded GDAL runtime: GDAL 2.1.3, released 2017/20/01
 Path to GDAL shared files: /Library/Frameworks/R.framework/Versions/3.5/Resources/library/rgdal/gdal
 GDAL binary built with GEOS: FALSE 
 Loaded PROJ.4 runtime: Rel. 4.9.3, 15 August 2016, [PJ_VERSION: 493]
 Path to PROJ.4 shared files: /Library/Frameworks/R.framework/Versions/3.5/Resources/library/rgdal/proj
 Linking to sp version: 1.3-1 
> 
> ui <- fluidPage(
+    
+    # Application title
+    titlePanel("Land Registry Survey"),
+ 
+    # Show a plot of the generated distribution
+    leafletOutput("mymap",height = 1000)
+    )
> 
> 
> # Define server logic required to draw a histogram
> server <- function(input, output) {
+    
+   output$mymap <- renderLeaflet({
+ 
+     world_spdf=readOGR("world_spdf", layer="world_spdf")
+     
+     mypalette = colorFactor( palette=c("Red","DarkBlue"), domain=world_spdf@data$availbl, na.color="white")
+     
+     # Prepar the text for the tooltip:
+     mytext=paste("Country: ", world_spdf@data$NAME,"<br/>", "Publicly Available: ", world_spdf@data$txt_vlb, "<br/>", "Highest Level: ", world_spdf@data$hghstlv, sep="") %>%
+       lapply(htmltools::HTML)
+     
+     leaflet(world_spdf) %>% 
+       addTiles()  %>% 
+       setView( lat=10, lng=0 , zoom=2) %>%
+       addPolygons(fillColor = ~mypalette(availbl), stroke=FALSE,label = mytext) %>%
+       addLegend( pal=mypalette, values=~availbl, opacity=0.9, title = "Publicly Available<br>Land Registry", position = "topleft" )
+     
+   })
+ }
> 
> # Run the application 
> shinyApp(ui = ui, server = server)

Listening on http://127.0.0.1:6421
OGR data source with driver: ESRI Shapefile 
Source: "/Users/davidszakonyi/Dropbox/ACDC/Code/R/RealEstateMapping/LandRegistry/world_spdf", layer: "world_spdf"
with 246 features
It has 16 fields

> rsconnect::deployApp()
Preparing to deploy application...
Update application currently deployed at
https://dszakonyi.shinyapps.io/LandRegistry/? [Y/n] Y
DONE
Uploading bundle for application: 967148...DONE
Deploying bundle: 2133075 for application: 967148 ...
Waiting for task: 619938452
  building: Parsing manifest
  building: Building image: 2249218
  building: Installing system dependencies
  building: Building package: rlang
  building: Building package: viridisLite
  building: Building package: crayon
  building: Building package: gtable
  building: Building package: xtable
  building: Building package: magrittr
  building: Building package: sourcetools
  building: Building package: labeling
  building: Building package: openssl
  building: Building package: colorspace
  building: Building package: stringi
  building: Building package: withr
  building: Building package: png
  building: Building package: mime
  building: Building package: fansi
  building: Building package: packrat
  building: Building package: utf8
  building: Building package: R6
  building: Building package: munsell
  building: Building package: RColorBrewer
  building: Building package: MASS
  building: Building package: yaml
  building: Building package: base64enc
  building: Building package: lazyeval
  building: Building package: lattice
  building: Building package: sp
  building: Building package: rgdal
  building: Building package: nlme
  building: Building package: bitops
  building: Building package: RCurl
  building: Building package: digest
  building: Building package: glue
  building: Building package: stringr
  building: Building package: jsonlite
  building: Building package: Rcpp
  building: Building package: raster
  building: Building package: plyr
  building: Building package: reshape2
  building: Building package: gridExtra
  building: Building package: assertthat
  building: Building package: cli
  building: Building package: pillar
  building: Building package: tibble
  building: Building package: htmltools
  building: Building package: htmlwidgets
  building: Building package: rstudioapi
  building: Building package: BH
  building: Building package: later
  building: Building package: rsconnect
  building: Building package: scales
  building: Building package: Matrix
  building: Building package: mgcv
  building: Building package: ggplot2
  building: Building package: viridis
  building: Building package: markdown
  building: Building package: promises
  building: Building package: httpuv
  building: Building package: shiny
  building: Building package: crosstalk
  building: Building package: leaflet
  building: Installing packages
  building: Installing files
  building: Pushing image: 2249218
  deploying: Starting instances
  rollforward: Activating new instances
  terminating: Stopping old instances
Application successfully deployed to https://dszakonyi.shinyapps.io/LandRegistry/

Looking at your application's logs indicates that the application you have deployed is actually trying to deploy an application:

F2019-06-05T18:17:14.064515654Z Preparing to deploy application...DONE
O2019-06-05T18:17:19.345070978Z Uploading bundle for application: 967148...DONE
U2019-06-05T18:17:19.354975696Z Deploying bundle: 2133441 for application: 967148 ...
;2019-06-05T18:17:19.600468864Z Waiting for task: 619975149
<2019-06-05T18:17:20.746291650Z   building: Parsing manifest
J2019-06-05T18:17:22.862772877Z   building: Installing system dependencies
�2019-06-05T18:18:12.230572029Z 2019/06/05 18:18:12 [worker f1eacd11; process 18] Failed to connect: Unable to connect to worker after 60.00 seconds; startup took too long.