Shiny app deploying perfectly locally but not on shinyapps.io ...

My app is deploying perfectly locally, but some of the outputs are missing when I deploy on shinyapps.io... no errors...

Code below:

Server:

library(shiny)
library(shinydashboard)

input_element_color <- "primary"
highlight_color <- "navy"
regular_color <- "navy"

shinyServer(function(input, output) {

output$I_plot <- renderPlot({

############# Multiple plot function ###################
## http://www.cookbook-r.com/Graphs/Multiple_graphs_on_one_page_(ggplot2)/ ##

# multiplot <- function(..., plotlist=NULL, file, cols=1, layout=NULL) {
#     library(grid)
#     
#     # Make a list from the ... arguments and plotlist
#     plots <- c(list(...), plotlist)
#     
#     numPlots = length(plots)
#     
#     # If layout is NULL, then use 'cols' to determine layout
#     if (is.null(layout)) {
#         # Make the panel
#         # ncol: Number of columns of plots
#         # nrow: Number of rows needed, calculated from # of cols
#         layout <- matrix(seq(1, cols * ceiling(numPlots/cols)),
#                          ncol = cols, nrow = ceiling(numPlots/cols))
#     }
#     
#     if (numPlots==1) {
#         print(plots[[1]])
#         
#     } else {
#         # Set up the page
#         grid.newpage()
#         pushViewport(viewport(layout = grid.layout(nrow(layout), ncol(layout))))
#         
#         # Make each plot, in the correct location
#         for (i in 1:numPlots) {
#             # Get the i,j matrix positions of the regions that contain this subplot
#             matchidx <- as.data.frame(which(layout == i, arr.ind = TRUE))
#             
#             print(plots[[i]], vp = viewport(layout.pos.row = matchidx$row,
#                                             layout.pos.col = matchidx$col))
#         }
#     }
# }


# Fentanyl policy project

# install.packages("markovchain")
#  install.packages("diagram")
library(markovchain)
library(diagram)
library(ggplot2)
library(tidyverse)
library(kableExtra)
library(priceR)

# Alexandra Savinkina
# 6/7/22

#Inputs:

atRisk <- input$atRisk

Prop_Incid <- 1-input$PropIncid 
Prop_Reg <- input$PropIncid 

PropHighIncid <- 0.1
PropMedIncid <- 0.3
PropLowIncid <- 0.6

PropHighReg <- 0.3
PropMedReg <- 0.5
PropLowReg <- 0.2

PropFentanyl <- input$propFentanyl



Prop_AtRisk_Incid <- ifelse(atRisk==1, Prop_Incid*PropHighIncid,
                            ifelse(atRisk==2, Prop_Incid*(PropHighIncid+PropMedIncid),
                                   ifelse(atRisk==3, Prop_Incid,0)))
Prop_AtRisk_Reg <- ifelse(atRisk==1, Prop_Reg*PropHighReg,
                          ifelse(atRisk==2, Prop_Reg*(PropHighReg+PropMedReg),
                                 ifelse(atRisk==3, Prop_Reg,0)))



Death_Rate_Incid <- 0.000703391#0.0029/12 #assuming 15% fatal overdose # 0.0019 assuming 10% fatal overdose 
Death_Rate_Reg <- 0.000703391#0.0029/12 #assuming 15% fatal overdose # 0.0019 assuming 10% fatal overdose

Death_Rate_Jail <- 0.00001/12

Arrest_Rate_Incid <- as.numeric(input$Arrests)/12
Arrest_Rate_Reg <- Arrest_Rate_Incid

Arrest_text1 <- ifelse(input$Arrests==0.13, "Standard policing",
                       ifelse(input$Arrests==0.05, "Treatment-informed Policing", "Aggressive Policing"))

Arrest_text2 <- ifelse(input$Arrests==0.13, "13%",
                       ifelse(input$Arrests==0.05, "5%", "20%"))

Charge_Rate_Incid <- 1
Charge_Rate_Reg <- 1

Jail_Rate_Incid <- Arrest_Rate_Incid*Charge_Rate_Incid
Jail_Rate_Reg <- Arrest_Rate_Reg*Charge_Rate_Reg

Arrest_Mult_Arrest <- 2.43
Arrest_Mult_Death1 <- 40
Arrest_Mult_Death2 <- 10


state_cost <- read.csv(file='prisoncosts_state.csv')
state_cost <- state_cost[,c(1,5)]

Cost_Jail <- as.numeric(state_cost[which(state_cost$State==input$costarrest),2])

Cost_Death <- ifelse(input$costdeath == "Value of a statistical life",  10099517 ,
                     ifelse(input$costdeath == "Healthcare costs only",  5462,
                            ifelse(input$costdeath == "Lost productivity costs only",  1443151,0 )))

drug_use_pop_state <- read.csv(file="drugusestate.csv")

N_pop1 <- (as.numeric(drug_use_pop_state[which(drug_use_pop_state$State==input$costarrest),4]))
N_pop <- (as.numeric(drug_use_pop_state[which(drug_use_pop_state$State==input$costarrest),4]))*PropFentanyl

# Model parameters

# Rate of first felony:

Felony_1_incid <-Jail_Rate_Incid*Prop_AtRisk_Incid
Felony_1_reg <-Jail_Rate_Reg*Prop_AtRisk_Reg

# Rate of second felony

Felony_2_incid <-Jail_Rate_Incid*Prop_AtRisk_Incid*Arrest_Mult_Arrest
Felony_2_reg <-Jail_Rate_Reg*Prop_AtRisk_Reg*Arrest_Mult_Arrest

# Rate of death, not directly after incarceration

Death_1_incid <- Death_Rate_Incid
Death_1_reg <- Death_Rate_Reg

# Rate of death directly following incarceration

Death_2_incid <- Death_Rate_Incid*Arrest_Mult_Death1
Death_2_reg <- Death_Rate_Reg*Arrest_Mult_Death1

Death_3_incid <- Death_Rate_Incid*Arrest_Mult_Death2
Death_3_reg <- Death_Rate_Reg*Arrest_Mult_Death2

# Model

trans_mat <- matrix(c(1-Felony_1_incid-Death_1_incid,Felony_1_incid,0,0,0,Death_1_incid,0,0,0,0,0,0,# Not Jailed, incidental
                      0,(1-Death_Rate_Jail-1/6),1/6,0,0,Death_Rate_Jail,0,0,0,0,0,0, # Jail, first time, incidental
                      0, Felony_2_incid, 0, 1-Death_3_incid-Felony_2_incid,0, Death_3_incid,0,0,0,0,0,0,# Within one month of release
                      0, Felony_2_incid, 0, 1-Felony_2_incid-Death_2_incid-1/11, 1/11, Death_2_incid,0,0,0,0,0,0,# First year within release
                      0, Felony_2_incid, 0, 0, 1-Felony_2_incid-Death_1_incid, Death_1_incid,0,0,0,0,0,0,# More than 1 post-release incidental
                      0,0,0,0,0,1,0,0,0,0,0,0, # Death, incid
                      0,0,0,0,0,0,1-Felony_1_reg-Death_1_reg,Felony_1_reg,0,0,0,Death_1_reg,# Not Jailed, not regental
                      0,0,0,0,0,0,0,(1-Death_Rate_Jail-1/6),1/6,0,0,Death_Rate_Jail, # Jail, first time, not regental
                      0,0,0,0,0,0,0, Felony_2_reg, 0, 1-Death_3_reg-Felony_2_reg,0, Death_3_reg,# Directly post-release not regental
                      0,0,0,0,0,0,0,Felony_2_reg, 0, 1-Felony_2_reg-Death_2_reg-1/11, 1/11, Death_2_reg,# More than 6 months post-release not regental
                      0,0,0,0,0,0,0, Felony_2_reg, 0, 0, 1-Felony_2_reg-Death_1_reg, Death_1_reg,
                      0,0,0,0,0,0,0,0,0,0,0,1 # Death, not incidental
),nrow = 12, byrow = TRUE)
trans_mat


disc_trans <- new("markovchain",transitionMatrix=trans_mat, states=c("Not arrested, incidental use","Arrested, incidental use","Released, Immediate, incidental use","Released, within year, incidental use","Released, post one year, incidental use","Dead, incidental use",
                                                                     "Not arrested, regular use","Arrested, regular use","Released, Immediate, regular use","Released, within year, regular use","Released, post one year, regular use","Dead, regular use"), name="MC 1") 

disc_trans
#plot(disc_trans)

Current_state<-c(Prop_Incid,0,0,0,0,0,Prop_Reg,0,0,0,0,0)
steps<-as.numeric(input$timeframe)*12

Data <- data.frame(matrix(0,nrow=steps,ncol=13))
colnames(Data) <- c("month","Not arrested_incid","Arrested_incid","Released_immediate_incid","Released_1yr_incid","Released_post1yr_incid","Dead_incid",
                    "Not arrested_reg","Arrested_reg","Released_immediate_reg","Released_1yr_reg","Released_post1yr_reg","Dead_reg")
Data$month <- c(1:steps)

for (i in 1:steps) {
  
  finalState<-Current_state*disc_trans^i #using power operator
  Data[i,2:13] <- finalState
  
}


Data_People <- Data*N_pop
Data_People$month <- trunc(Data_People$month/N_pop)

Data_People$ChargeCost <- Data_People$Arrested_incid*Cost_Jail+Data_People$Arrested_reg*Cost_Jail
Data_People$DeathCost <- Data_People$Dead_incid*Cost_Death+Data_People$Dead_reg*Cost_Death

Data_People$ChargeCostCum <- cumsum(Data_People$ChargeCost)

Data_People2 <- Data_People[,c(1,3:16)]
Data_Long <- gather(Data_People2, key="observation", value="value",-month)
Data_Long2 <- gather(Data_People, key="observation", value="value",-month)


Data_Cost_Long <- Data_Long2[which((Data_Long2$observation=="ChargeCostCum"|Data_Long2$observation=="DeathCost") & Data_Long2$month==steps),]

# 
#output$Table <- renderTable(Data_People)

time= as.numeric(input$timeframe)*12

Deaths_incid <- trunc(Data_People[Data_People$month==time,'Dead_incid'])
Arrests_incid <- trunc(Data_People[Data_People$month==time,'Arrested_incid']) + 
  trunc(Data_People[Data_People$month==time,'Released_immediate_incid'])+ 
  trunc(Data_People[Data_People$month==time,'Released_post1yr_incid'])

Deaths_reg <- trunc(Data_People[Data_People$month==time,'Dead_reg'])
Arrests_reg <- trunc(Data_People[Data_People$month==time,'Arrested_reg']) + 
  trunc(Data_People[Data_People$month==time,'Released_immediate_reg'])+ 
  trunc(Data_People[Data_People$month==time,'Released_post1yr_reg'])

Costs_death <-trunc(Data_People[Data_People$month==time,'DeathCost'])

Costs_arrest <- trunc(Data_People[Data_People$month==time,'ChargeCostCum'])

Costs_total <- format_dollars(Costs_arrest+Costs_death)

Costs_arrest <- format_dollars(Costs_arrest)

Costs_death <- format_dollars(Costs_death)


output$StateText<- renderText({ 
  paste("The population that reported illicit drug use (non-marijuana) in ", input$costarrest,  " is",
        prettyNum(N_pop1, big.mark = ","), ", the average cost of a month in prison in ", input$costarrest, "is ", format_dollars(Cost_Jail), ".",
        Arrest_text1, "leads to an annual arrest rate of", Arrest_text2)
})

output$Deaths_incid <- renderValueBox({
  valueBox(prettyNum(Deaths_incid, big.mark = ","), "Arrests in population with unknown fentanyl possession",
           #icon = icon("skull"),
           color = "red")
})

output$Deaths_reg <- renderValueBox({
  valueBox(prettyNum(Deaths_reg, big.mark = ","), "Deaths in population with known fentanyl possession",
           icon = icon("skull"), 
           color = "red")
})

output$Arrests_incid <- renderValueBox({
  valueBox(prettyNum(Arrests_incid, big.mark = ","), "Arrests in population with unknown fentanyl possession",
           #icon = icon("trailer"),
           color = "orange")
})

output$Arrests_reg <- renderValueBox({
  valueBox(prettyNum(Arrests_reg, big.mark = ","), "Arrests in population with known fentanyl possession",
           #icon = icon("trailer"),
           color = "orange")
})

output$Costs_total <- renderValueBox({
  valueBox(Costs_total, "Total costs from death and arrest",
           #icon = icon("dollar"),
           color = "green")
})

output$Costs_death <- renderValueBox({
  valueBox(Costs_death, "Total costs from death",
           #icon = icon("dollar"),
           color = "green")
})


output$Costs_arrest <- renderValueBox({
  valueBox(Costs_arrest, "Total costs from arrest",
           #icon = icon("dollar"),
           color = "green")
})

})
})

UI:

library(shiny)
library(shinydashboard)
library(scales)
library(tidyverse)
library(plotly)

UI for shiny app looking at felonization of fentanyl posession

input_element_color <- "primary"
highlight_color <- "navy"
regular_color <- "navy"

header <- dashboardHeader(
tags$li(
class = "dropdown"),
title = "Effects of policy felonizing fentanyl possession", titleWidth = 500
)

sidebar <- dashboardSidebar(
sidebarMenu(
id = "sidebar",
menuItem("Dashboard", tabName = "dashboard", icon = icon("dashboard")),
menuItem("Source Code", icon = icon("file-code-o"),
href = ),
menuItem("Original Spreadsheet", icon = icon("google-drive"), href=),
menuItem("References", tabName = "references", icon = icon("book"))
)
)

body <- dashboardBody(
tags$head(tags$style(HTML('
/* logo */
.skin-blue .main-header .logo {
background-color: #08306b;
}

    /* logo when hovered */
    .skin-blue .main-header .logo:hover {
                          background-color: #08306b;
                          }

    /* navbar (rest of the header) */
    .skin-blue .main-header .navbar {
                          background-color: #deebf7;
                          }        

    /* main sidebar */
    .skin-blue .main-sidebar {
                          background-color: #08306b;
                          }

    /* active selected tab in the sidebarmenu */
    .skin-blue .main-sidebar .sidebar .sidebar-menu .active a{
                          color: #eff3ff;
                          background-color: #084594;
                          }

    /* other links in the sidebarmenu */
    .skin-blue .main-sidebar .sidebar .sidebar-menu a{
                          background-color: #c6dbef;
                          color: #000000;
                          }

    /* other links in the sidebarmenu when hovered */
     .skin-blue .main-sidebar .sidebar .sidebar-menu a:hover{
                          background-color: #fcfbfd;
                          }
    /* toggle button when hovered  */                    
     .skin-blue .main-header .navbar .sidebar-toggle:hover{
                          background-color: #084594;
     }
                          
       .box.box-solid.box-primary>.box-header {

#color:#000000;
background:#08306b
}

.box.box-solid.box-primary{
border-bottom-color:#807dba;
border-left-color:#c6dbef;
border-right-color:#c6dbef;
border-top-color:#c6dbef;

}

                          '))),


#     tags$style(HTML("
# 
# 


#                                   ")),


tabItems(
    tabItem(
        # MAIN DASHBOARD ---------------------------------------------------
        tabName = "dashboard",
        ## INPUTS --------
        column(width = 4,
               ## Population
               box(title = "Inputs", width = NULL, solidHeader = TRUE, status = input_element_color,
                   collapsible = TRUE, collapsed = FALSE,
                   selectInput("costarrest",
                               ("State"),
                               choices= c(paste(as.character(state.name)),"US Average"), selected="Colorado") ,
                   
                   selectInput("atRisk", ("How much fentanyl is a felony?"), 
                               choices = list("Greater than 4g" = 1, "Greater than 1g" = 2,
                                              "Any amount" = 3), selected = 1),
                   
                   selectInput("timeframe", ("Length of simulation?"),
                               choices = list("One year" = 1, "Five years" = 5,
                                              "Ten years" = 10), selected = 10),
                   
                   sliderInput("propFentanyl", 
                               ("Proportion of the illicit drug supply that contains fentanyl"), 
                               min=0, max=1, value=0.8),
                   
                   sliderInput("PropIncid", 
                               ("Proportion of the overall population who uses illicit drugs that knowingly possess fentanyl"), 
                               min=0, max=1, value=0.5),
                   
                   selectInput("Arrests", 
                               ("Policing strategy"), 
                               choices= list("Standard Policing"= 0.13, "Aggressive Policing"= 0.3,
                                             "Treatment-informed Policing"=0.05), selected= "Standard Policing"),
                   
                   selectInput("costdeath", 
                               ("Costs associated with a death"), 
                               choices= list("Healthcare costs only", "Lost productivity costs only",
                                             "Value of a statistical life"), selected= "Value of a statistical life")
               )
        ),
        
        ## OUTPUT: plot and metrics --------
        
        column(width = 8, 
               fluidRow(box(textOutput("StateText"), width=8,background="navy")),
               fluidRow(
                   valueBoxOutput("Deaths_incid", width = 4),
                   valueBoxOutput("Deaths_reg", width = 4)),
               
               fluidRow(valueBoxOutput("Arrests_incid", width = 4),
                        valueBoxOutput("Arrests_reg", width = 4),
               ),
               fluidRow(
                   valueBoxOutput("Costs_arrest", width = 8),
                   valueBoxOutput("Costs_death", width = 6)),
               
               fluidRow(valueBoxOutput("Costs_total", width = 8)),
               
               fluidRow(plotlyOutput("I_plot"), width = 400)
        )
    ),
    ## References ----------------------------------------------------------
    tabItem(
        tabName = "references"
    )
)

)

ui <- dashboardPage(header, sidebar, body)

This is how it looks online

And this is local...

The dashboard looks quite nice!

Is everything contained in a single app.R file for the deployment, or do you have additional files (e.g., CSS or other styling files)?

I'm not as familiar with shinyapps.io deployments, but I deploy to RStudio Connect all the time. For those, I can see deployment logs during the deployment build. Have you had a chance to view those logs? Maybe something here could be of help: Chapter 9 Troubleshooting | shinyapps.io user guide.

Again, nice work on the dashboard!

Thank you!!! I was very proud of it until I realized it wasn't working on deployment... for some reason no matter what I do, it only shows that one single valueboxoutput and not any of the others... all the calculations are there because if I replace the one that's showing up with another value it works, but only the single box shows up... it's driving me a little nuts!!

I only have the app.R file (or, files- server and ui are separate).

here's what the log looks like...

2022-08-18T01:00:07.290602+00:00 shinyapps[6801557]: Warning: namespace ‘lemon’ is not available and has been replaced
2022-08-18T01:00:07.290666+00:00 shinyapps[6801557]: by .GlobalEnv when processing object ‘knit_print.data.frame’
2022-08-18T01:00:07.290797+00:00 shinyapps[6801557]: 2: replacing previous import ‘lifecycle::last_warnings’ by ‘rlang::last_warnings’ when loading ‘pillar’
2022-08-18T01:00:07.290706+00:00 shinyapps[6801557]: During startup - Warning messages:
2022-08-18T01:00:07.291154+00:00 shinyapps[6801557]: knitr version: 1.33
2022-08-18T01:00:07.290831+00:00 shinyapps[6801557]: Running on host: 8ea00326a189
2022-08-18T01:00:07.290863+00:00 shinyapps[6801557]: Server version: 2022.06.2
2022-08-18T01:00:07.290752+00:00 shinyapps[6801557]: 1: replacing previous import ‘lifecycle::last_warnings’ by ‘rlang::last_warnings’ when loading ‘tibble’
2022-08-18T01:00:07.290895+00:00 shinyapps[6801557]: LANG: C.UTF-8
2022-08-18T01:00:07.291117+00:00 shinyapps[6801557]: rmarkdown version: 2.10
2022-08-18T01:00:07.291308+00:00 shinyapps[6801557]: htmltools version: 0.5.2
2022-08-18T01:00:07.290963+00:00 shinyapps[6801557]: Running content using the current R environment
2022-08-18T01:00:07.291042+00:00 shinyapps[6801557]: shiny version: 1.7.1
2022-08-18T01:00:07.291078+00:00 shinyapps[6801557]: httpuv version: 1.6.3
2022-08-18T01:00:07.291006+00:00 shinyapps[6801557]: R version: 4.1.0
2022-08-18T01:00:07.291227+00:00 shinyapps[6801557]: jsonlite version: 1.7.2
2022-08-18T01:00:07.291266+00:00 shinyapps[6801557]: RJSONIO version: (none)
2022-08-18T01:00:07.291352+00:00 shinyapps[6801557]: reticulate version: (none)
2022-08-18T01:00:07.291391+00:00 shinyapps[6801557]: Using pandoc: /opt/connect/ext/pandoc/2.16
2022-08-18T01:00:07.290926+00:00 shinyapps[6801557]: Working directory: /srv/connect/apps/FentanylPolicy
2022-08-18T01:00:08.290555+00:00 shinyapps[6801557]: Using jsonlite for JSON processing
2022-08-18T01:00:08.290674+00:00 shinyapps[6801557]: Starting R with process ID: '135'
2022-08-18T01:00:08.290764+00:00 shinyapps[6801557]:
2022-08-18T01:00:08.290602+00:00 shinyapps[6801557]:
2022-08-18T01:00:08.290717+00:00 shinyapps[6801557]: Shiny application starting ...
2022-08-18T01:00:08.290884+00:00 shinyapps[6801557]: Attaching package: ‘shinydashboard’
2022-08-18T01:00:08.290803+00:00 shinyapps[6801557]: Listening on http://127.0.0.1:33301
2022-08-18T01:00:08.290960+00:00 shinyapps[6801557]: The following object is masked from ‘package:graphics’:
2022-08-18T01:00:08.290845+00:00 shinyapps[6801557]:
2022-08-18T01:00:08.290992+00:00 shinyapps[6801557]:
2022-08-18T01:00:08.291030+00:00 shinyapps[6801557]: box
2022-08-18T01:00:08.290926+00:00 shinyapps[6801557]:
2022-08-18T01:00:08.291080+00:00 shinyapps[6801557]:
2022-08-18T01:00:08.291123+00:00 shinyapps[6801557]: Warning: replacing previous import ‘lifecycle::last_warnings’ by ‘rlang::last_warnings’ when loading ‘hms’
2022-08-18T01:00:08.291170+00:00 shinyapps[6801557]: ── Attaching packages ─────────────────────────────────────── tidyverse 1.3.1 ──
2022-08-18T01:00:08.291241+00:00 shinyapps[6801557]: :heavy_check_mark: ggplot2 3.3.5 :heavy_check_mark: purrr 0.3.4
2022-08-18T01:00:08.291280+00:00 shinyapps[6801557]: :heavy_check_mark: tibble 3.1.4 :heavy_check_mark: dplyr 1.0.7
2022-08-18T01:00:08.291318+00:00 shinyapps[6801557]: :heavy_check_mark: tidyr 1.1.3 :heavy_check_mark: stringr 1.4.0
2022-08-18T01:00:08.291358+00:00 shinyapps[6801557]: :heavy_check_mark: readr 2.0.1 :heavy_check_mark: forcats 0.5.1
2022-08-18T01:00:09.290607+00:00 shinyapps[6801557]: ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
2022-08-18T01:00:09.290677+00:00 shinyapps[6801557]: :heavy_multiplication_x: readr::col_factor() masks scales::col_factor()
2022-08-18T01:00:09.290769+00:00 shinyapps[6801557]: :heavy_multiplication_x: dplyr::filter() masks stats::filter()
2022-08-18T01:00:09.290811+00:00 shinyapps[6801557]: :heavy_multiplication_x: dplyr::lag() masks stats::lag()
2022-08-18T01:00:09.290725+00:00 shinyapps[6801557]: :heavy_multiplication_x: purrr::discard() masks scales::discard()
2022-08-18T01:00:09.290857+00:00 shinyapps[6801557]:
2022-08-18T01:00:09.290891+00:00 shinyapps[6801557]: Attaching package: ‘plotly’
2022-08-18T01:00:09.290923+00:00 shinyapps[6801557]:
2022-08-18T01:00:09.290957+00:00 shinyapps[6801557]: The following object is masked from ‘package:ggplot2’:
2022-08-18T01:00:09.290990+00:00 shinyapps[6801557]:
2022-08-18T01:00:09.291045+00:00 shinyapps[6801557]: last_plot
2022-08-18T01:00:09.291122+00:00 shinyapps[6801557]: The following object is masked from ‘package:stats’:
2022-08-18T01:00:09.291086+00:00 shinyapps[6801557]:
2022-08-18T01:00:09.291152+00:00 shinyapps[6801557]:
2022-08-18T01:00:09.291188+00:00 shinyapps[6801557]: filter
2022-08-18T01:00:09.291251+00:00 shinyapps[6801557]:
2022-08-18T01:00:09.291299+00:00 shinyapps[6801557]: The following object is masked from ‘package:graphics’:
2022-08-18T01:00:09.291346+00:00 shinyapps[6801557]:
2022-08-18T01:00:09.291389+00:00 shinyapps[6801557]: layout
2022-08-18T01:00:09.291428+00:00 shinyapps[6801557]:
2022-08-18T01:00:09.291470+00:00 shinyapps[6801557]: This Font Awesome icon ('dashboard') does not exist:
2022-08-18T01:00:09.291517+00:00 shinyapps[6801557]: * if providing a custom html_dependency these name checks can
2022-08-18T01:00:09.291557+00:00 shinyapps[6801557]: be deactivated with verify_fa = FALSE
2022-08-18T01:00:09.291602+00:00 shinyapps[6801557]: This Font Awesome icon ('file-code-o') does not exist:
2022-08-18T01:00:09.291644+00:00 shinyapps[6801557]: * if providing a custom html_dependency these name checks can
2022-08-18T01:00:09.291682+00:00 shinyapps[6801557]: be deactivated with verify_fa = FALSE
2022-08-18T01:00:11.290566+00:00 shinyapps[6801557]: Package: markovchain
2022-08-18T01:00:11.290849+00:00 shinyapps[6801557]:
2022-08-18T01:00:11.290973+00:00 shinyapps[6801557]: The following object is masked from ‘package:dplyr’:
2022-08-18T01:00:11.290676+00:00 shinyapps[6801557]: Date: 2022-05-24
2022-08-18T01:00:11.291011+00:00 shinyapps[6801557]:
2022-08-18T01:00:11.290628+00:00 shinyapps[6801557]: Version: 0.8.9
2022-08-18T01:00:11.290724+00:00 shinyapps[6801557]: BugReport: Issues · spedygiorgio/markovchain · GitHub
2022-08-18T01:00:11.290771+00:00 shinyapps[6801557]:
2022-08-18T01:00:11.290810+00:00 shinyapps[6801557]: Loading required package: shape
2022-08-18T01:00:11.290889+00:00 shinyapps[6801557]: Attaching package: ‘kableExtra’
2022-08-18T01:00:11.290930+00:00 shinyapps[6801557]:
2022-08-18T01:00:11.291049+00:00 shinyapps[6801557]: group_rows
2022-08-18T01:00:11.291087+00:00 shinyapps[6801557]:

I think the log you have is incomplete, was it through the shinyapps.io web portal ?
You should get them via rsconnect::showLogs() function