File: ui.R

package info (click to toggle)
rquantlib 0.4.17-1
  • links: PTS, VCS
  • area: main
  • in suites: bookworm
  • size: 1,308 kB
  • sloc: cpp: 3,690; sh: 69; makefile: 6; ansic: 4
file content (33 lines) | stat: -rw-r--r-- 1,069 bytes parent folder | download | duplicates (5)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
library(shiny)

shinyUI(fluidPage(
    
    ## Application title
    titlePanel("Simple DiscountCurve Example from RQuantLib"),
  
    ## Sidebar with controls to select parameters
    sidebarLayout(
        sidebarPanel(
            radioButtons("interpolation", "Interpolation type:",
                         c("loglinear" = "loglinear",
                           "linear" = "linear",
                           "spline" = "spline")),

            br(),

            radioButtons("curve", "Curve type:",
                         c("forwards" = "forwards",
                           "zero rates" = "zerorates",
                           "discounts" = "discounts"))
        ),
        
        ## Show a tabset that includes a plot, summary, and table view
        mainPanel(
            tabsetPanel(type = "tabs", 
                        tabPanel("Plot", plotOutput("plot")), 
                        tabPanel("Summary", verbatimTextOutput("summary")), 
                        tabPanel("Table", tableOutput("table"))
                        )
        )
    )
))