[Yuima-commits] r551 - in pkg/yuimaGUI: . R inst/yuimaGUI inst/yuimaGUI/www man

noreply at r-forge.r-project.org noreply at r-forge.r-project.org
Fri Jan 6 19:16:19 CET 2017


Author: phoenix844
Date: 2017-01-06 19:16:17 +0100 (Fri, 06 Jan 2017)
New Revision: 551

Added:
   pkg/yuimaGUI/inst/yuimaGUI/www/black.css
   pkg/yuimaGUI/inst/yuimaGUI/www/white.css
Modified:
   pkg/yuimaGUI/DESCRIPTION
   pkg/yuimaGUI/R/sourceCodeYuimaGUI.R
   pkg/yuimaGUI/inst/yuimaGUI/global.R
   pkg/yuimaGUI/inst/yuimaGUI/server.R
   pkg/yuimaGUI/inst/yuimaGUI/ui.R
   pkg/yuimaGUI/inst/yuimaGUI/www/custom.css
   pkg/yuimaGUI/man/yuimaGUI.Rd
Log:
white theme now available

Modified: pkg/yuimaGUI/DESCRIPTION
===================================================================
--- pkg/yuimaGUI/DESCRIPTION	2016-12-16 03:59:11 UTC (rev 550)
+++ pkg/yuimaGUI/DESCRIPTION	2017-01-06 18:16:17 UTC (rev 551)
@@ -1,10 +1,10 @@
 Package: yuimaGUI
 Type: Package
-Title: A Graphical User Interface for the Yuima Package
-Version: 0.9.5
+Title: A Graphical User Interface for the 'yuima' Package
+Version: 0.9.6
 Author: YUIMA Project Team
 Maintainer: Emanuele Guidotti <emanuele.guidotti at studenti.unimi.it>
-Description: Provides a graphical user interface for the yuima package.
+Description: Provides a graphical user interface for the 'yuima' package.
 License: GPL-2
 Depends: R(>= 3.0.0) 
 Imports: DT (>= 0.2), shinyjs, shiny, shinydashboard, shinyBS, yuima, quantmod, sde, ggplot2
\ No newline at end of file

Modified: pkg/yuimaGUI/R/sourceCodeYuimaGUI.R
===================================================================
--- pkg/yuimaGUI/R/sourceCodeYuimaGUI.R	2016-12-16 03:59:11 UTC (rev 550)
+++ pkg/yuimaGUI/R/sourceCodeYuimaGUI.R	2017-01-06 18:16:17 UTC (rev 551)
@@ -1,12 +1,20 @@
-yuimaGUI <- function() {
+yuimaGUI <- function(theme = "last") {
+
+  print("Please wait while loading...")
+  addr <- system.file("yuimaGUI", package = "yuimaGUI")
+  
+  if(theme!="last"){
+    addr_from <- paste(addr, "/www/", theme, ".css", sep = "")
+    addr_to <- paste(addr, "/www/custom.css", sep = "")
+    if(file.exists(addr_from))
+      file.copy(from = addr_from, to = addr_to, overwrite = TRUE)
+    else print("Theme not supported.")
+  }
+  
   utils::capture.output(
     suppressWarnings(
-      shiny::runApp(
-        system.file(
-          "yuimaGUI",
-          package = "yuimaGUI"
-        )
-      )
+      shiny::runApp(addr)
     )
   )
+  
 }

Modified: pkg/yuimaGUI/inst/yuimaGUI/global.R
===================================================================
--- pkg/yuimaGUI/inst/yuimaGUI/global.R	2016-12-16 03:59:11 UTC (rev 550)
+++ pkg/yuimaGUI/inst/yuimaGUI/global.R	2017-01-06 18:16:17 UTC (rev 551)
@@ -11,3 +11,11 @@
 
 if(!exists("yuimaGUIdata"))
   yuimaGUIdata <- reactiveValues(series=list(), model=list(), usr_model = list(), simulation=list(), usr_simulation = list(), cp=list(), cpYuima=list(), llag = list(), cluster = list(), hedging = list())
+
+getSimulation <- function(symb, n = 1){
+  return(isolate({yuimaGUIdata$simulation[[symb]][[n]]}))
+}
+
+getSeries <- function(symb){
+  return(isolate({yuimaGUIdata$series[[symb]]}))
+}

Modified: pkg/yuimaGUI/inst/yuimaGUI/server.R
===================================================================
--- pkg/yuimaGUI/inst/yuimaGUI/server.R	2016-12-16 03:59:11 UTC (rev 550)
+++ pkg/yuimaGUI/inst/yuimaGUI/server.R	2017-01-06 18:16:17 UTC (rev 551)
@@ -142,7 +142,7 @@
       if (symb %in% names(yuimaGUIdata$series))
         alreadyIn <- c(alreadyIn, symb)
       else{
-        temp <- data.frame("Index" = rownames(x), "symb" = as.numeric(as.character(x[,symb])))
+        temp <- data.frame("Index" = rownames(x), "symb" = as.numeric(gsub(as.character(x[,symb]), pattern = ",", replacement = ".")))
         temp <- temp[complete.cases(temp), ]
         rownames(temp) <- temp[,"Index"]
         colnames(temp) <- c("Index", symb)
@@ -1345,19 +1345,19 @@
     withProgress(message = 'Clustering: ', value = 0, {
       k <- 1
       for(i in 1:l){
-        delta_i <- as.numeric(abs(mean(diff(index(object)[!is.na(object[,i])]), na.rm = TRUE)))
+        #delta_i <- as.numeric(abs(mean(diff(index(object)[!is.na(object[,i])]), na.rm = TRUE)))
         if (percentage == TRUE) data_i <- as.vector(na.omit(Delt(object[,i])))
         else data_i <- as.vector(na.omit(diff(object[,i])))
         data_i <- data_i[data_i!="Inf"]
-        dens1 <-  density(data_i/sqrt(delta_i)+mean(data_i, na.rm = TRUE)*(1/delta_i-1/sqrt(delta_i)), na.rm = TRUE)
+        dens1 <-  density(data_i, na.rm = TRUE)#/sqrt(delta_i)+mean(data_i, na.rm = TRUE)*(1/delta_i-1/sqrt(delta_i)), na.rm = TRUE)
         for(j in i:l)
           if (i!=j){
             incProgress(2/(l*(l-1)), detail = paste(k,"(/", l*(l-1)/2 ,")"))
-            delta_j <- as.numeric(abs(mean(diff(index(object)[!is.na(object[,j])]), na.rm = TRUE)))
+            #delta_j <- as.numeric(abs(mean(diff(index(object)[!is.na(object[,j])]), na.rm = TRUE)))
             if (percentage == TRUE) data_j <- as.vector(na.omit(Delt(object[,j])))
             else data_j <- as.vector(na.omit(diff(object[,j])))
             data_j <- data_j[data_j!="Inf"]
-            dens2 <-  density(data_j/sqrt(delta_j)+mean(data_j, na.rm = TRUE)*(1/delta_j-1/sqrt(delta_j)), na.rm = TRUE)
+            dens2 <-  density(data_j, na.rm = TRUE)#/sqrt(delta_j)+mean(data_j, na.rm = TRUE)*(1/delta_j-1/sqrt(delta_j)), na.rm = TRUE)
             f_dist <- function(x) {0.5*abs(f(x,dens1)-f(x,dens2))}
             dist <- try(integrate(f_dist, lower = min(dens1$x[1],dens2$x[1]), upper = max(last(dens1$x), last(dens2$x)), subdivisions = 100000, rel.tol = 0.01))
             d[j,i] <- min(1, ifelse(class(dist)=="try-error", 1, dist$value))
@@ -2467,17 +2467,18 @@
     id <- unlist(strsplit(rownames(yuimaGUItable$model)[rowToPrint$id], split = " "))
     info <- yuimaGUIdata$model[[id[1]]][[as.numeric(id[2])]]$info
     div(
-      h3(id[1], " - " , info$modName),
+      h3(id[1], " - " , info$modName, class = "hModal"),
       h4(
         em("delta:"), info$delta, br(),
         em("series to log:"), info$toLog, br(),
         em("method:"), info$method, br(),
         em("threshold:"), info$threshold, br(),
         em("trials:"), info$trials, br(),
-        em("seed:"), info$seed, br()
+        em("seed:"), info$seed, br(),
         #REMOVE# em("joint:"), info$joint, br(),
         #REMOVE# em("aggregation:"), info$aggregation, br(),
         #REMOVE# em("threshold:"), info$threshold
+        class = "hModal"
       ),
       align="center"
     )
@@ -2594,7 +2595,7 @@
           ksTest <- try(ks.test(x = as.numeric(z$V1), "pnorm"))
           output$model_modal_plot_test <- renderUI({
             if(class(ksTest)!="try-error")
-              HTML(paste("<div><h5>Kolmogorov-Smirnov p-value (the two distributions coincide): ", format(ksTest$p.value, scientific=T, digits = 2), "</h5></div>"))
+              HTML(paste("<div><h5 class='hModal'>Kolmogorov-Smirnov p-value (the two distributions coincide): ", format(ksTest$p.value, scientific=T, digits = 2), "</h5></div>"))
           })
         }
         
@@ -2647,7 +2648,7 @@
             ksTest <- try(ks.test(x = as.numeric(dx$V1), "pnorm", mean = mu_jump, sd = sigma_jump))
             output$model_modal_plot_test <- renderUI({
               if(class(ksTest)!="try-error")
-                HTML(paste("<div><h5>Kolmogorov-Smirnov p-value (the two distributions coincide): ", format(ksTest$p.value, scientific=T, digits = 2), "</h5></div>"))
+                HTML(paste("<div><h5 class='hModal'>Kolmogorov-Smirnov p-value (the two distributions coincide): ", format(ksTest$p.value, scientific=T, digits = 2), "</h5></div>"))
             })
           }
           if(y$info$jumps=="Uniform"){
@@ -2668,7 +2669,7 @@
             ksTest <- try(ks.test(x = as.numeric(dx$V1), "punif", min = a_jump, max = b_jump))
             output$model_modal_plot_test <- renderUI({
               if(class(ksTest)!="try-error")
-                HTML(paste("<div><h5>Kolmogorov-Smirnov p-value (the two distributions coincide): ", format(ksTest$p.value, scientific=T, digits = 2), "</h5></div>"))
+                HTML(paste("<div><h5 class='hModal'>Kolmogorov-Smirnov p-value (the two distributions coincide): ", format(ksTest$p.value, scientific=T, digits = 2), "</h5></div>"))
             })
           }
           
@@ -3210,12 +3211,16 @@
               Initial <- round(digits = 0, yuimaGUIsettings$simulation[[modID]][["t0"]]/as.numeric(mean(diff(index(data)))))*yuimaGUIdata$model[[id[1]]][[as.numeric(id[2])]]$model at sampling@delta
               Terminal <- round(digits = 0, yuimaGUIsettings$simulation[[modID]][["t1"]]/as.numeric(mean(diff(index(data)))))*yuimaGUIdata$model[[id[1]]][[as.numeric(id[2])]]$model at sampling@delta
             }
-            if (yuimaGUIdata$model[[id[1]]][[as.numeric(id[2])]]$info$class %in% c("COGARCH", "CARMA") | is.na(yuimaGUIsettings$simulation[[modID]][["nstep"]])){
+            if (yuimaGUIdata$model[[id[1]]][[as.numeric(id[2])]]$info$class %in% c("COGARCH", "CARMA")){
               n <- (Terminal-Initial)/yuimaGUIdata$model[[id[1]]][[as.numeric(id[2])]]$model at sampling@delta
               #delta <- yuimaGUIdata$model[[id[1]]][[as.numeric(id[2])]]$model at sampling@delta
-            } else {
-              n <- yuimaGUIsettings$simulation[[modID]][["nstep"]]
-              #delta <- NA
+            } else if (!is.null(yuimaGUIsettings$simulation[[modID]][["nstep"]])) {
+              if (is.na(yuimaGUIsettings$simulation[[modID]][["nstep"]])) {
+                n <- (Terminal-Initial)/yuimaGUIdata$model[[id[1]]][[as.numeric(id[2])]]$model at sampling@delta
+              } else {
+                n <- yuimaGUIsettings$simulation[[modID]][["nstep"]]
+                #delta <- NA
+              } 
             }
             if (yuimaGUIdata$model[[id[1]]][[as.numeric(id[2])]]$info$class=="Fractional process") true.parameter <- as.list(yuimaGUIdata$model[[id[1]]][[as.numeric(id[2])]]$qmle["Estimate",])
             else true.parameter <- as.list(yuimaGUIdata$model[[id[1]]][[as.numeric(id[2])]]$qmle at coef)
@@ -3643,7 +3648,7 @@
                         "Median"="median", 
                         "centroid"="Centroid")
       if (dist=="Minkowski") dist <- paste(dist, " (", info$power,")", sep = "")
-      return(HTML(paste("<div style='color:#CDCECD;'><h4>&nbsp &nbsp Linkage:",linkage, " &nbsp &nbsp &nbsp &nbsp Distance:", dist, "</h4></div>")))
+      return(HTML(paste("<div><h4>&nbsp &nbsp Linkage:",linkage, " &nbsp &nbsp &nbsp &nbsp Distance:", dist, "</h4></div>")))
     }
   })
   
@@ -3796,9 +3801,10 @@
     if(!is.null(input$changepoint_symb)){
       info <- yuimaGUIdata$cp[[input$changepoint_symb]]
       div(
-        h3(input$changepoint_symb),
+        h3(input$changepoint_symb, class = "hModal"),
         h4(
-          em(switch(info$method, "KSdiff"="Increments Distriution", "KSperc"="Percentage Increments Distriution")), br()
+          em(switch(info$method, "KSdiff"="Increments Distriution", "KSperc"="Percentage Increments Distriution")), br(),
+          class = "hModal"
         ),
         align="center"
       )
@@ -4182,7 +4188,7 @@
         h4(
           em(paste("Change Point:", as.character(isolate({yuimaGUIdata$cpYuima[[input$parametric_changepoint_symb]]$tau}))))
         ),
-        align="center", style="color:#CDCECD"
+        align="center"
       )
     }
   })
@@ -4190,12 +4196,12 @@
   output$parametric_changepoint_modal_info_text <- renderUI({
     info <- yuimaGUIdata$cpYuima[[input$parametric_changepoint_symb]]$info
     div(
-      h3(input$parametric_changepoint_symb, " - " , info$model),
+      h3(input$parametric_changepoint_symb, " - " , info$model, class = "hModal"),
       h4(
         em("series to log:"), info$toLog, br(),
         em("method:"), info$method, br(),
         em("trials:"), info$trials, br(),
-        em("seed:"), info$seed, br()
+        em("seed:"), info$seed, br(), class = "hModal"
       ),
       align="center")
   })
@@ -4435,7 +4441,7 @@
                          "PTHY"="Pre-averaged Truncated Hayashi-Yoshida", 
                          "SRC"="Subsampled Realized Covariance", 
                          "SBPC"="Subsampled realized BiPower Covariation")
-        return(HTML(paste("<div style='color:#CDCECD;'><h4>&nbsp &nbsp Method:", method, "</h4></div>")))
+        return(HTML(paste("<div><h4>&nbsp &nbsp Method:", method, "</h4></div>")))
       }
     }
   })

Modified: pkg/yuimaGUI/inst/yuimaGUI/ui.R
===================================================================
--- pkg/yuimaGUI/inst/yuimaGUI/ui.R	2016-12-16 03:59:11 UTC (rev 550)
+++ pkg/yuimaGUI/inst/yuimaGUI/ui.R	2017-01-06 18:16:17 UTC (rev 551)
@@ -36,24 +36,24 @@
     tabItem(tabName = "home",
       fluidRow(
         column(12,
-          h1("Welcome to yuimaGUI", style="color:#edeeed", align = "center"),
-          h4("an amazingly powerful tool for your analysis", style="color:#edeeed; font-family: Times New Roman, Georgia, Serif;", align = "center"), 
+          h1("Welcome to yuimaGUI", align = "center", class = "hTitle"),
+          h4("an amazingly powerful tool for your analysis", align = "center"), 
           hr(class = "hrHeader"),
-          h4("Get acquainted with yuimaGUI and learn how to best exploit it in a few simple steps:", style="color:#edeeed", align = "center"),
+          h4("Get acquainted with yuimaGUI and learn how to best exploit it in a few simple steps:", class = "hTitle", align = "center"),
           br()
       )),
       fluidRow(
         column(8,
-          h4("Step 1", style="color:#edeeed"),
+          h4("Step 1", class = "hTitle"),
           h4("Load the data you wish to analyze in section 'Data I/O'.", br(), 
              "An easy way to load economic data (i.e. GDP) or financial series (stocks and shares) from the Internet is provided. Otherwise you can load data from your own files.",br(),
-             "Once data are loaded, you can go and use sections 'Explorative Data Analysis' and 'Modeling'.", style="color:#CDCECD; font-family: Times New Roman, Georgia, Serif;"),
-          h4("Step 2", style="color:#edeeed"),
+             "Once data are loaded, you can go and use sections 'Explorative Data Analysis' and 'Modeling'."),
+          h4("Step 2", class = "hTitle"),
           h4("Model data in section 'Modeling'.", br(),
              "Here you can fit models choosing between some default options or defining your own model.", br(),
-             "Now you are ready to go to section 'Simulate'.", style="color:#CDCECD; font-family: Times New Roman, Georgia, Serif;"),
-          h4("Step 3", style="color:#edeeed"),
-          h4("Read the short explanation at the beginning of every section for further information. Enjoy!", style="color:#CDCECD; font-family: Times New Roman, Georgia, Serif;")
+             "Now you are ready to go to section 'Simulate'."),
+          h4("Step 3", class = "hTitle"),
+          h4("Read the short explanation at the beginning of every section for further information. Enjoy!")
         ),
         column(4,
           br(), br(),
@@ -62,15 +62,15 @@
       ),
       fluidRow(
         column(8,h4(),br(),br(),br(),
-          h4("Tips", style="color:#edeeed"),
+          h4("Tips", class = "hTitle"),
           h4("Press F11 to go to full screen.", br(),
-             "Press CTRL+ or CTRL- to zoom in and out.", style="color:#CDCECD; font-family: Times New Roman, Georgia, Serif;")
+             "Press CTRL+ or CTRL- to zoom in and out.")
         ),
         column(4,
-          h3(em("Developed by"), style="color:#edeeed", align = "center"),
-          h4("Emanuele Guidotti", style="color:#CDCECD; font-family: Times New Roman, Georgia, Serif;", align = "center"),
-          h3(em("in collaboration with"), style="color:#edeeed", align = "center"),
-          h4("Stefano M. Iacus & Lorenzo Mercuri", style="color:#CDCECD; font-family: Times New Roman, Georgia, Serif;", align = "center")
+          h3(em("Developed by"), class = "hTitle", align = "center"),
+          h4("Emanuele Guidotti", align = "center"),
+          h3(em("in collaboration with"), class = "hTitle", align = "center"),
+          h4("Stefano M. Iacus & Lorenzo Mercuri", align = "center")
         )
       )
     ),
@@ -78,7 +78,7 @@
     tabItem(tabName="finData",
       fluidRow(
         column(12,
-          h3("Load Financial and Economic data",style="color:#edeeed"),
+          h3("Load Financial and Economic data",class = "hTitle"),
           h4("For Stocks and Shares select Yahoo source using symbols you can find ",
              a("here", href="http://finance.yahoo.com/lookup", target = "_blank"), ".",
              br(),
@@ -88,17 +88,16 @@
              "Economic series are available on ",a("Federal Reserve Bank of St. Louis", href="https://research.stlouisfed.org/fred2/", target = "_blank"), ".",
              "Follow this ", a("example",href="example.jpg", target = "_blank"), " to find symbols.",
              br(),
-             "Multiple symbols are allowed if divided by empty space and/or commas (e.g. AAPL FB CSCO or AAPL,FB,CSCO).",
-             style="color:#CDCECD; font-family: Times New Roman, Georgia, Serif;"),
+             "Multiple symbols are allowed if divided by empty space and/or commas (e.g. AAPL FB CSCO or AAPL,FB,CSCO)."),
           hr(class = "hrHeader")
         )
       ),
       fluidRow(column(12,bsAlert("finDataAlert"))),
       fluidRow(
         column(6,
-          textInput(inputId="symb", value = NULL,label = span(style="color:#CDCECD", "Insert Symbol")),
-          dateRangeInput(inputId="dR", label = span(style="color:#CDCECD", "Download data from"), start = "1900-01-01" ,end = Sys.Date()),
-          selectInput(inputId="sources", label = span(style="color:#CDCECD", "Source"), choices = c("Yahoo (OHLC data)" = "yahoo", "Oanda (Currencies &  Metals)" = "oanda", "Federal Reserve Bank of St. Louis" = "FRED")),
+          textInput(inputId="symb", value = NULL,label = "Insert Symbol"),
+          dateRangeInput(inputId="dR", label = "Download data from", start = "1900-01-01" ,end = Sys.Date()),
+          selectInput(inputId="sources", label = "Source", choices = c("Yahoo (OHLC data)" = "yahoo", "Oanda (Currencies &  Metals)" = "oanda", "Federal Reserve Bank of St. Louis" = "FRED")),
           tags$button(type="button", id="finDataGo", class = "action-button", em("Load data")),
           br(),br(),br(),
           column(9),
@@ -128,15 +127,14 @@
     tabItem("yourData",
       fluidRow(
         column(12,
-          h3("Load data from Your Own Files",style="color:#edeeed"),
+          h3("Load data from Your Own Files",class = "hTitle"),
           h4("Upload your file and specify its structure. A preview will be shown below.",
              br(),
              "Declare if the file contains raw and/or column headers and specify what kind of field separator has to be used to read the data.",
              br(),
              "Each column will be uploaded as a different series. So you might want to switch columns with rows if your file is organized differently.",
              br(),
-             "Specify the format and the column to use as index.",
-              style="color:#CDCECD; font-family: Times New Roman, Georgia, Serif;"),
+             "Specify the format and the column to use as index."),
           hr(class = "hrHeader")
         )
       ),
@@ -180,13 +178,12 @@
     tabItem(tabName="models", fluidRow(column(12,
       fluidRow(
         column(12,
-          h3("Univariate Model Estimation",style="color:#edeeed"),
+          h3("Univariate Model Estimation",class = "hTitle"),
           h4("Select the data and the model you wish to estimate. Every model will be fitted to every selected series.",
              br(),
              "Click on buttons 'Set Range' and 'Advanced Settings' to customize the estimation process.",
              br(),
-             "Some default models are available but you can set your own model (tab 'Set model') and use it for estimation and/or simulation purposes.",
-             style="color:#CDCECD; font-family: Times New Roman, Georgia, Serif;"),
+             "Some default models are available but you can set your own model (tab 'Set model') and use it for estimation and/or simulation purposes."),
           hr(class = "hrHeader")
         )
       ),
@@ -203,18 +200,18 @@
               uiOutput("pq_C")
             )),
             column(5,
-              fluidRow(shinyjs::hidden(h4(id="titlePrintModelLatex","Models to estimate:", style="color:#CDCECD;font-size: 2em; font-family: Goudy Old Style, Serif"))),
+              fluidRow(shinyjs::hidden(h4(id="titlePrintModelLatex","Models to estimate:", style="font-size: 2em;"))),
               fluidRow(uiOutput("PrintModelLatex"))
             )
           ),
           br(),
           fluidRow(
             column(4,
-                   h4("Available data", style="color:#CDCECD"),
+                   h4("Available data"),
                    DT::dataTableOutput("database3")
             ),
             column(4,
-                   h4("Selected data", style="color:#CDCECD"),
+                   h4("Selected data"),
                    DT::dataTableOutput("database4")
             ),
             column(4,
@@ -265,7 +262,7 @@
           shinyjs::hidden(div(id="estimates_info", fluidRow(
             column(12,
               textOutput("SymbolName"),
-              a(id = "linkMoreInfo", tags$u("More Info"), href = "", style="color:#FFF48B"),
+              a(id = "linkMoreInfo", tags$u("More Info"), href = ""),
               bsModal(id = "MoreInfo", trigger = "linkMoreInfo", title = "Info", size = "large",
                 column(12,
                   fluidRow(uiOutput("text_MoreInfo")),
@@ -289,7 +286,7 @@
           br(),
           fluidRow(
             column(2,actionButton(inputId = "databaseModels_button_showResults", label = "Show Fitting")),
-            bsTooltip("databaseModels_button_showResults", title = "Available for: Diffusive Processes", placement = "top"),
+            bsTooltip("databaseModels_button_showResults", title = "Available for: Diffusive Processes, Compound Poisson and COGARCH", placement = "top"),
             column(6),
             column(2,actionButton(inputId = "databaseModelsDelete", label = "Delete")),
             bsTooltip("databaseModelsDelete", title = "Delete selected model", placement = "top"),
@@ -314,8 +311,8 @@
           )
         )
       ))),
-      bsModal(id="plotsRange", trigger = "DisplayPlotsRange", title = div(h4(em("Select range to use for models estimation")), align="center"), size = "large",
-        div(id="plotsRangeErrorMessage",align = "center",h3("Select some series from table 'Available Data'")),
+      bsModal(id="plotsRange", trigger = "DisplayPlotsRange", title = "Select range to use for models estimation", size = "large",
+        div(id="plotsRangeErrorMessage",align = "center",h3("Select some series from table 'Available Data'", class = "hModal")),
         div(id="plotsRangeAll",
           fluidRow(
             column(8,
@@ -341,13 +338,13 @@
           )
         )
       ),
-      bsModal(id="advancedSettings", title=div(h4(em(a("Advanced Settings", style="color:blue", href="http://www.rdocumentation.org/packages/yuima/functions/qmle", target = "_blank"))),align="center"), trigger = "advancedSettingsButton", size = "large",
-        div(id="advancedSettingsErrorMessage",align = "center",h3("Select some models and series (from table 'Available Data')")),
+      bsModal(id="advancedSettings", title="Advanced Settings", trigger = "advancedSettingsButton", size = "large",
+        div(id="advancedSettingsErrorMessage",align = "center",h3("Select some models and series (from table 'Available Data')", class = "hModal")),
         div(id="advancedSettingsAll",
           fluidRow(
             column(6,
               box(width = 12,div(align="center",
-                h3("Series Settings"),
+                h3("Series Settings", class = "hModal"),
                 uiOutput("advancedSettingsSeries", align="center"),
                 fluidRow(
                   column(6,uiOutput("advancedSettingsDelta", align="center")),
@@ -359,7 +356,7 @@
                 )
               )),
               box(width = 12,div(align="center",
-                h3("General Settings"),
+                h3("General Settings", class = "hModal"),
                 uiOutput("advancedSettingsMethod", align="center"),
                 uiOutput("advancedSettingsThreshold", align="center"),
                 fluidRow(
@@ -377,7 +374,7 @@
             ),
             column(6,
               box(width = 12,div(align="center",
-                h3("Model Settings"),
+                h3("Model Settings", class = "hModal"),
                 uiOutput("advancedSettingsModel", align="center"),
                 uiOutput("advancedSettingsParameter", align="center"),
                 uiOutput("advancedSettingsFixed", align="center"),
@@ -404,13 +401,12 @@
     tabItem(tabName = "simulate",
       fluidRow(
         column(12,
-          h3("Univariate Simulation",style="color:#edeeed"),
+          h3("Univariate Simulation",class = "hTitle"),
           h4("Select the estimated models you wish to simulate.",
              br(),
              "If you want to simulate a model that has not been estimated you can use tab 'Simuate equation'.",
              br(),
-             "Click on buttons 'Set Simulation' and 'Advanced Settings' to customize the simulation process.",
-             style="color:#CDCECD; font-family: Times New Roman, Georgia, Serif;"),
+             "Click on buttons 'Set Simulation' and 'Advanced Settings' to customize the simulation process."),
           hr(class = "hrHeader")
         )
       ),
@@ -418,7 +414,7 @@
         tabPanel(title = "Simulate model",
           fluidRow(column(12,bsAlert("panel_simulate_model_alert"))),
           fluidRow(column(12, br(),
-            h4("Available models", style="color:#CDCECD"),
+            h4("Available models"),
             DT::dataTableOutput("simulate_databaseModels"),
             br(),
             fluidRow(
@@ -487,7 +483,7 @@
         fluidRow(
           column(12,br(),br(),br()),
           column(8,
-            h4("Selected Models", style="color:#CDCECD"),
+            h4("Selected Models"),
             DT::dataTableOutput("simulate_selectedModels")
           ),
           column(4,
@@ -506,7 +502,7 @@
           column(4,actionButton("simulate_simulateModels", label = "Start Simulation", align = "center"))
         )
       ),
-      bsModal(id="simulate_showSimulation", trigger = "simulate_monitor_button_showSimulation", title = div(h4(em("Simulation")), align="center"), size = "large",
+      bsModal(id="simulate_showSimulation", trigger = "simulate_monitor_button_showSimulation", title = "Simulation", size = "large",
         fluidRow(column(12,
           fluidRow(column(8,div(align="center",uiOutput("simulate_showSimulation_simID")))),
           fluidRow(div(id="simulate_showSimulation_plot_div", align = "center",
@@ -537,9 +533,9 @@
           ))
         ))
       ),
-      bsModal(id="simulate_setSimulation", trigger = "simulate_button_setSimulation", title = div(h4(em("Set Simulation")), align="center"), size = "small",
+      bsModal(id="simulate_setSimulation", trigger = "simulate_button_setSimulation", title = "Set Simulation", size = "small",
         tags$style(type = "text/css", ".datepicker{z-index: 1100 !important;}"),
-        div(id="simulate_setSimulation_errorMessage",align = "center", h3("Select some models first")),
+        div(id="simulate_setSimulation_errorMessage",align = "center", h3("Select some models first", class = "hModal")),
         div(id="simulate_setSimulation_body", align = "center",
           uiOutput("simulate_modelID"),
           br(),
@@ -561,8 +557,8 @@
           )
         )
       ),
-      bsModal(id="simulate_advancedSettings", trigger = "simulate_button_advancedSettings", title = div(h4(em("Advanced Settings")), align="center"), size = "small",
-        div(id="simulate_advancedSettings_errorMessage", align = "center", h3("Select some models first")),
+      bsModal(id="simulate_advancedSettings", trigger = "simulate_button_advancedSettings", title = "Advanced Settings", size = "small",
+        div(id="simulate_advancedSettings_errorMessage", align = "center", h3("Select some models first", class = "hModal")),
         div(id="simulate_advancedSettings_body", align = "center",
           uiOutput("simulate_advancedSettings_modelID"),
           uiOutput("simulate_seed"),
@@ -576,28 +572,27 @@
     tabItem(tabName = "cluster",
       fluidRow(
         column(12,
-          h3("Clustering",style="color:#edeeed"),
+          h3("Clustering",class = "hTitle"),
           h4("Select data you want to cluster.", br(),
              "Choose the distance you want to use and the kind of linkage for the hierarchical cluster analysis.", br(),
-             "Results will be shown below by plotting dendrogram and multidimensional scaling output.",
-                        style="color:#CDCECD; font-family: Times New Roman, Georgia, Serif;"),
+             "Results will be shown below by plotting dendrogram and multidimensional scaling output."),
           hr(class = "hrHeader")
         )
       ),
       fluidRow(column(12,bsAlert("cluster_alert"))),
       fluidRow(column(12,
         column(4,
-          h4("Available data", style="color:#CDCECD"),
+          h4("Available data"),
           DT::dataTableOutput("cluster_table_select")
         ),
         column(4,
-          h4("Selected data", style="color:#CDCECD"),
+          h4("Selected data"),
           DT::dataTableOutput("cluster_table_selected")
         ),
         column(4,br(),br(),
           div(align="center",
             selectInput("cluster_linkage", "Linkage", choices = c("Complete"="complete", "Single"="single", "Average"="average", "Ward"="ward.D", "Ward squared"="ward.D2", "McQuitty"="mcquitty", "Median"="median", "Centroid"="centroid")),
-            selectInput("cluster_distance", "Distance", choices = c("Markov Operator"="MOdist", "Percentage Increments Distribution"="MYdist_perc", "Increments Distribution"="MYdist_ass", "Euclidean"="euclidean", "Maximum"="maximum", "Manhattan"="manhattan", "Canberra"="canberra", "Minkowski"="minkowski")),
+            selectInput("cluster_distance", "Distance", choices = c("Percentage Increments Distribution"="MYdist_perc", "Increments Distribution"="MYdist_ass", "Markov Operator"="MOdist", "Euclidean"="euclidean", "Maximum"="maximum", "Manhattan"="manhattan", "Canberra"="canberra", "Minkowski"="minkowski")),
             shinyjs::hidden(numericInput("cluster_distance_minkowskiPower", label = "Power", value = 2)))
         )
       )),
@@ -639,11 +634,10 @@
     tabItem(tabName = "changepoint",
       fluidRow(
         column(12,
-          h3("Change Point Estimation",style="color:#edeeed"),
+          h3("Change Point Estimation",class = "hTitle"),
           h4("Select the data you wish to estimate change points for.", br(),
             "Choose the algorithm you want to use for estimation.", br(),
-            "Results will be shown below by plotting the series and the detected change points.",
-            style="color:#CDCECD; font-family: Times New Roman, Georgia, Serif;"),
+            "Results will be shown below by plotting the series and the detected change points."),
           hr(class = "hrHeader")
         )
       ),
@@ -652,11 +646,11 @@
           fluidRow(column(12,bsAlert("nonparametric_changepoint_alert"))),
           fluidRow(column(12,
             column(4,
-              h4("Available data", style="color:#CDCECD"),
+              h4("Available data"),
               DT::dataTableOutput("changepoint_table_select")
             ),
             column(4,
-              h4("Selected data", style="color:#CDCECD"),
+              h4("Selected data"),
               DT::dataTableOutput("changepoint_table_selected")
             ),
             column(4,br(),br(),br(),br(),
@@ -682,7 +676,7 @@
             uiOutput("changepoint_symb", align="center"),
             div(fluidRow(
               column(6, div(align = "left", selectInput("changepoint_scale", label = "Scale", choices=c("Linear","Logarithmic (Y)","Logarithmic (X)", "Logarithmic (XY)"), width = "150px"))),
-              column(6, div(align = "right", a(id = "linkChangePointInfo", tags$u(h4("Change Points Info")), href = "", style="color:#FFF48B")))
+              column(6, div(align = "right", br(), a(id = "linkChangePointInfo", "Change Points Info", style = "font-size: 140%;", href = "")))
             )),
             bsModal(id = "ChangePointInfo", trigger = "linkChangePointInfo", title = "Change Points Info",
                     column(12,
@@ -708,11 +702,11 @@
                  fluidRow(column(12,bsAlert("parametric_changepoint_alert"))),
                  fluidRow(column(12,
                                  column(4,
-                                        h4("Available data", style="color:#CDCECD"),
+                                        h4("Available data"),
                                         DT::dataTableOutput("parametric_changepoint_table_select")
                                  ),
                                  column(4,
-                                        h4("Selected data", style="color:#CDCECD"),
+                                        h4("Selected data"),
                                         DT::dataTableOutput("parametric_changepoint_table_selected")
                                  ),
                                  column(4,br(),br(),div(align="center", 
@@ -721,13 +715,13 @@
                                         br(),
[TRUNCATED]

To get the complete diff run:
    svnlook diff /svnroot/yuima -r 551


More information about the Yuima-commits mailing list