App using randomForest fails to load, works locally

I am trying to deploy an app to shinyapps.io that works just fine locally, but will not load online. I get the "Disconnected from the server" message. More befuddling: The logs are not giving me an error message I can identify as pointing to the problem. Here is what the app looks like:

library(shiny)
library(shinythemes)
library(flexdashboard)
library(tidyverse)
library(plotly)

#Modeling
library(randomForest)
library(RCurl)
library(magrittr)

model_rf <- readRDS("model_rf.RData")
denials <- read.csv("denials.csv")

ui<-fluidPage(theme =shinytheme("cosmo"),
              fluidRow(
                
                column(8, 
                       h1("Mortgage Denial Calculator"),
                       column(6,
                              radioButtons("model_state", label="Please Select State",
                                           choices =list("Florida" = 0, "Arizona" = 2,"Colorado" = 1), selected = 2,inline = TRUE), # STATE SELECT
                              
                              numericInput("applicant_age",
                                           label="Please input your Age", 
                                           value = 27,
                                           min=18,
                                           max=100),
                              
                              sliderInput("dti_ratio", 
                                          label = "Please select your Debt to Income Ratio",
                                          min=0, 
                                          max=100,
                                          value= 20)
                       ),#column
                       
                       column(6,
                              numericInput("income_amount", 
                                           label = "Please input your Household Income",
                                           value= 140000),
                              numericInput("loan_amount", 
                                           label = "Please input your Loan Amount", 
                                           value = 400000),
                              numericInput("down_payment", 
                                           label = "Please input your Down Payment",
                                           value=30000)
                       ),
                       column(12,align = "center", style = "padding-top:3%; padding-bottom:3%;", submitButton("Calculate")),
                       column(12,align = "center",gaugeOutput("scale"))
                ),
                
                column(4,
                       h4("Top reasons applicants in this state were denied a home loan:",  style = "padding-top: 50px;"),
                       div(plotlyOutput("graph"),align = "center")
                ) # plot
                
  ) #full container 
)

server<-function(input, output) {
    
  datasetInput  <- reactive({
    df<-data.frame(
      state=factor(input$model_state,levels = c(0,1,2)),
      applicant_age=as.integer(input$applicant_age), 
      income_amount=as.integer(input$income_amount), 
      loan_amount=as.integer(input$loan_amount), 
      dti_ratio=as.integer(input$dti_ratio), 
      down_payment=as.integer(input$down_payment)
    )
    
    
    output<-data.frame(Prediction=predict(model_rf, df), round(predict(model_rf, df, type="prob"),3))
    print(output)
    
  })
  
  output$scale <- renderGauge({
    
    gauge(datasetInput()$Denied*100,
          min = 0,
          max =100,
          symbol ='%',
          label = 'Probability of Denial',
          gaugeSectors(danger = c(80, 100),
                       warning = c(40,79),
                       success= c(0,39))
    )
    
  })
  
  output$graph <- renderPlotly({
    m <- list(l=50, r=20, b=20, t=50, pad=4)
    subset(denials, denials$state %in% input$model_state) %>%
      dplyr::filter(p!=0.00)%>%
      plot_ly(x = ~p,y = ~Denied_Reason,type = 'bar',text = ~p,textposition = 'outside', texttemplate="%{p:$.2f}")%>% 
      layout(yaxis = list(categoryorder = "total ascending",title="",howgrid = F, showline = F,zeroline = F), 
             xaxis = list(showticklabels = FALSE, title="", howgrid = F, showline = F,zeroline = F, range = c(0,50)),title = ' ', margin=m) 
  })
  
}
shinyApp(ui=ui, server=server)

There is no message in the log beginning "Error: ..." The only messages from the logs that seem to be problematic, though they're familiar with other apps I've deployed successfully:

2022-04-25T15:23:24.303473+00:00 shinyapps[6157631]: ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
2022-04-25T15:23:24.303518+00:00 shinyapps[6157631]: ✖ dplyr::filter() masks stats::filter()
2022-04-25T15:23:24.303563+00:00 shinyapps[6157631]: ✖ dplyr::lag()    masks stats::lag()

What is the starting point to investigate a problem like this? How do I tell what is going wrong? Thanks very much in advance for any help!

Yog could star by showing the complete log, the excerpt you are showing contains no useful information about your problem.

Sure. Here it is -- I was editing for length because what's confusing is the log as a whole doesn't seem to show anything useful but I could definitely be missing something. Here's the link so you can see my problem. Thank you.

2022-04-25T15:23:24.303473+00:00 shinyapps[6157631]: ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
2022-04-25T15:23:24.303518+00:00 shinyapps[6157631]: ✖ dplyr::filter() masks stats::filter()
2022-04-25T15:23:24.303563+00:00 shinyapps[6157631]: ✖ dplyr::lag()    masks stats::lag()
2022-04-25T15:23:24.303607+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.303653+00:00 shinyapps[6157631]: Attaching package: ‘plotly’
2022-04-25T15:23:24.303690+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.303813+00:00 shinyapps[6157631]:     last_plot
2022-04-25T15:23:24.303771+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.303854+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.303900+00:00 shinyapps[6157631]: The following object is masked from ‘package:stats’:
2022-04-25T15:23:24.303970+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.304019+00:00 shinyapps[6157631]:     filter
2022-04-25T15:23:24.304197+00:00 shinyapps[6157631]:     layout
2022-04-25T15:23:24.303726+00:00 shinyapps[6157631]: The following object is masked from ‘package:ggplot2’:
2022-04-25T15:23:24.304449+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.304059+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.304105+00:00 shinyapps[6157631]: The following object is masked from ‘package:graphics’:
2022-04-25T15:23:24.304596+00:00 shinyapps[6157631]:     combine
2022-04-25T15:23:24.304239+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.304322+00:00 shinyapps[6157631]: Type rfNews() to see new features/changes/bug fixes.
2022-04-25T15:23:24.304153+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.304643+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.304280+00:00 shinyapps[6157631]: randomForest 4.7-1
2022-04-25T15:23:24.304739+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.304365+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.304784+00:00 shinyapps[6157631]:     margin
2022-04-25T15:23:24.304538+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.305012+00:00 shinyapps[6157631]: The following object is masked from ‘package:tidyr’:
2022-04-25T15:23:24.304701+00:00 shinyapps[6157631]: The following object is masked from ‘package:ggplot2’:
2022-04-25T15:23:24.304494+00:00 shinyapps[6157631]: The following object is masked from ‘package:dplyr’:
2022-04-25T15:23:24.304830+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.304871+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.304965+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.305286+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.305328+00:00 shinyapps[6157631]: The following object is masked from ‘package:purrr’:
2022-04-25T15:23:24.304407+00:00 shinyapps[6157631]: Attaching package: ‘randomForest’
2022-04-25T15:23:24.304920+00:00 shinyapps[6157631]: Attaching package: ‘RCurl’
2022-04-25T15:23:24.305060+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.305106+00:00 shinyapps[6157631]:     complete
2022-04-25T15:23:24.305413+00:00 shinyapps[6157631]:     set_names
2022-04-25T15:23:24.305499+00:00 shinyapps[6157631]: The following object is masked from ‘package:tidyr’:
2022-04-25T15:23:24.305539+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.305147+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.305244+00:00 shinyapps[6157631]: Attaching package: ‘magrittr’
2022-04-25T15:23:24.305187+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.305459+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.305370+00:00 shinyapps[6157631]: 
2022-04-25T15:23:24.305580+00:00 shinyapps[6157631]:     extract
2022-04-25T15:23:24.305623+00:00 shinyapps[6157631]: 
2022-04-25T15:23:28.303174+00:00 shinyapps[6157631]: 
2022-04-25T15:23:28.303240+00:00 shinyapps[6157631]: Listening on http://127.0.0.1:33715

Bonsoir !! Je rencontre exactement le même problème.. J'arrive à déployer l'application sur shinyapps.io. Mais lorsque j'essaie de visualiser les résultats sur un téléphone ou sur ma machine à travers le lien, on me renvoie déconnecter du serveur.. Certains tableaux s'affichent normalement; mais les graphiques et les gros tableaux non. Quelqu'un pourra m'aider..
Merci d'avance!!