Issue with LaTeX expression from Rmd file in a Shiny App

I am writing a shiny app which calls a .Rmd file including some equations written in LaTeX.

After knit the .Rmd file in RStudio the equations display correctly in the Viewer panel but after Run App the app.R the HTML output does not shows the equations.

This is an example of the .Rmd file and the app.R. I couldn't find previous answers to this issue in this Community and I will appreciate your advise.

THE app.R FILE:

library(shiny)
library(shinyWidgets)
library(markdown)
require(gplots)
library(shinythemes)

ui <- fluidPage(theme = shinytheme("slate"), setBackgroundColor("gray")

,fluidRow(

column(2

,h4("OBSERVED")
,fileInput("File","Input file",multiple=FALSE,accept=NULL
,width=NULL,buttonLabel="Browse...",placeholder=" ")

) # End of column(2

,column(8

    ,tabPanel(h5("The software")
     	  ,br()
    	  ,tags$b("Description:")
    	  ,includeMarkdown("description.Rmd")
    )

) # End of column(8

,column(2
,theme = shinytheme("slate")
,h4("HANDLING")
,numericInput("bin2",HTML("Image bin width ['']"),600,min=1,max=3600,step=10,width=NULL)

) # End of column(2
) # End of: fluidrow
) # End of: fluidPage

server <- function(input,output,session) {

} # End of server

shinyApp(ui=ui,server=server)

THE .Rmd FILE:


title: "The software"
author: "Me"
date: "March 16, 2019"
output:
html_document:
mathjax: "https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.1/MathJax.js?config=TeX-AMS-MML_HTMLorMML"

body { text-align: justify}

LaTeX expression:

\rho(r) = A_{radial}~r^{-\alpha_{radial}}

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.