"GUMMA MANASA"
28/09/2020
The code included in this presentation shows the application of shiny app and its algorithm for the next 2 slides.
the viewers are requested to click on the url to go to the shiny application.
library(shiny) shinyUI(fluidPage( titlePanel(“WORD PREDICTION”), sidebarLayout( sidebarPanel(
textInput("box","Enter the word I or YOU",value=NULL)
),
mainPanel(
h2("DISPLAY OF NEXT PREDICTED WORD"),
textOutput("out1"),
)
)
))
library(shiny) shinyServer(function(input, output) { if(input$box==“I”){ output$out1<-renderText(“did”) } else if(input$box==“you”){ output$out1<-renderText(“do”) } else{ output$out1<-renderText(“nil”) }
})
The shiny app has been implemented using shinyapps.io and presentation regarding the same is the available.