[Yuima-commits] r564 - in pkg/yuimaGUI: . inst/yuimaGUI inst/yuimaGUI/www

noreply at r-forge.r-project.org noreply at r-forge.r-project.org
Wed Jan 11 00:31:35 CET 2017


Author: phoenix844
Date: 2017-01-11 00:31:35 +0100 (Wed, 11 Jan 2017)
New Revision: 564

Modified:
   pkg/yuimaGUI/DESCRIPTION
   pkg/yuimaGUI/inst/yuimaGUI/server.R
   pkg/yuimaGUI/inst/yuimaGUI/ui.R
   pkg/yuimaGUI/inst/yuimaGUI/www/black.css
   pkg/yuimaGUI/inst/yuimaGUI/www/white.css
Log:


Modified: pkg/yuimaGUI/DESCRIPTION
===================================================================
--- pkg/yuimaGUI/DESCRIPTION	2017-01-10 16:22:55 UTC (rev 563)
+++ pkg/yuimaGUI/DESCRIPTION	2017-01-10 23:31:35 UTC (rev 564)
@@ -1,7 +1,7 @@
 Package: yuimaGUI
 Type: Package
 Title: A Graphical User Interface for the 'yuima' Package
-Version: 0.10.2
+Version: 0.10.3
 Author: YUIMA Project Team
 Maintainer: Emanuele Guidotti <emanuele.guidotti at studenti.unimi.it>
 Description: Provides a graphical user interface for the 'yuima' package.

Modified: pkg/yuimaGUI/inst/yuimaGUI/server.R
===================================================================
--- pkg/yuimaGUI/inst/yuimaGUI/server.R	2017-01-10 16:22:55 UTC (rev 563)
+++ pkg/yuimaGUI/inst/yuimaGUI/server.R	2017-01-10 23:31:35 UTC (rev 564)
@@ -1656,21 +1656,15 @@
     }
   })
 
-  ###Exchange rows/columns of file
-  fileUp_T <- reactive({
-    if (!is.null(input$yourFile$datapath)){
-      z <- as.data.frame(t(fileUp_O()), check.names = FALSE)
-      if (input$yourFileHeader=="Only columns" | identical(colnames(z),paste("V",seq(1,length(colnames(z))),sep="")))
-        colnames(z) <- paste("X",seq(1,length(colnames(z))),"_",make.names(input$yourFile$name),sep="")
-      return(z)
-    }
-  })
-
   ###Display Index choices: columns of file or transposed file
   output$yourFileIndex <- renderUI({
     temp <- try(colnames(fileUp_O()))
-    if (input$yourFileSwitch==TRUE)
-      temp <- try(colnames(fileUp_T()))
+    if (input$yourFileSwitch==TRUE){
+      temp <- try(rownames(fileUp_O()))
+      if(class(temp)!="try-error")      
+        if (input$yourFileHeader=="Only columns" | identical(temp,paste("V",seq(1,length(temp)),sep="")))
+          temp <- paste("X",seq(1,length(temp)),"_",make.names(input$yourFile$name),sep="")
+    }
     if (class(temp)=="try-error")
       return(selectInput("yourFileIndex",label = "Index", choices = c("Default"="default","Numeric"="numeric"), selected = "default"))
     if (class(temp)!="try-error")
@@ -1682,7 +1676,11 @@
   fileUp <- reactive({
     if (!is.null(input$yourFile$datapath)){
       z <- fileUp_O()
-      if (input$yourFileSwitch==TRUE) z <- fileUp_T()
+      if (input$yourFileSwitch==TRUE) {
+        z <- as.data.frame(t(z), check.names = FALSE)
+        if (identical(colnames(z), as.character(seq(1,length(colnames(z))))))
+          colnames(z) <- paste("X",seq(1,length(colnames(z))),"_",make.names(input$yourFile$name),sep="")
+      }
       ###Display choices for Index Type and set to "numeric" if Index is "numeric"
       output$yourFileFUN <- renderUI({
         if (!is.null(input$yourFileIndex)){
@@ -4506,22 +4504,24 @@
         co<-melt(t(co))
         digits <- 2
       }
+      fillColor <- switch(getOption("yuimaGUItheme"), "black"="#282828", "white"="#f0f4f5")
+      textColor <- switch(getOption("yuimaGUItheme"), "black"="#CDCECD", "white"="black")
       ggplot(co, aes(Var1, Var2)) + # x and y axes => Var1 and Var2
         geom_tile(aes(fill = value)) + # background colours are mapped according to the value column
         geom_text(aes(label = round(co$value, digits))) + # write the values
-        scale_fill_gradient2(low = "#ff9f80", 
-                             mid = "gray30", 
-                             high = "lightblue", 
+        scale_fill_gradient2(low = "#ffa500", 
+                             mid = switch(getOption("yuimaGUItheme"), "black"="gray30", "white"="#C7E2DF"), 
+                             high = "#74d600", 
                              midpoint = 0) + # determine the colour
         theme(panel.grid.major.x=element_blank(), #no gridlines
               panel.grid.minor.x=element_blank(), 
               panel.grid.major.y=element_blank(), 
               panel.grid.minor.y=element_blank(),
-              panel.background=element_rect(fill="#282828"), # background=white
-              plot.background = element_rect(fill = "#282828", linetype = 0, color = "#282828"),
-              axis.text.x = element_text(angle=90,hjust = 1, size = 12,face = "bold", colour = "#CDCECD"),
-              plot.title = element_text(size=20,face="bold", colour = "#CDCECD", hjust = 0.5),
-              axis.text.y = element_text(size = 12,face = "bold",  colour = "#CDCECD")) + 
+              panel.background=element_rect(fill=fillColor), # background=white
+              plot.background = element_rect(fill = fillColor, linetype = 0, color = fillColor),
+              axis.text.x = element_text(angle=90,hjust = 1, size = 12,face = "bold", colour = textColor),
+              plot.title = element_text(size=20,face="bold", colour = textColor, hjust = 0.5),
+              axis.text.y = element_text(size = 12,face = "bold",  colour = textColor)) + 
         ggtitle(paste("Analyzed data from", info$start, "to", info$end)) + 
         theme(legend.title=element_text(face="bold", size=14)) + 
         scale_x_discrete(name="") +

Modified: pkg/yuimaGUI/inst/yuimaGUI/ui.R
===================================================================
--- pkg/yuimaGUI/inst/yuimaGUI/ui.R	2017-01-10 16:22:55 UTC (rev 563)
+++ pkg/yuimaGUI/inst/yuimaGUI/ui.R	2017-01-10 23:31:35 UTC (rev 564)
@@ -153,11 +153,11 @@
           uiOutput("yourFileFUN"),
           br(),
           div(align = "center", box(width = 7, background = switch(getOption("yuimaGUItheme"), "black"="black", "white"=NULL),  title = "More Settings", collapsible = TRUE, id = "yourFileMoreSettings", collapsed = TRUE,
-              selectInput('yourFileSwitch', 'Switch rows/columns', choices = c("No"=FALSE, "Yes"=TRUE)),
               textInput('yourFileDec', 'Decimal Separator', value = "."),
               textInput('yourFileThnd', 'Thousands Separator', value = ""),
               textInput("yourFileNA", "Missing Value string", value = "NA"),
-              numericInput("yourFileLine", "Begin from line", value = 1, min = 1, step = 1)
+              numericInput("yourFileLine", "Begin from line", value = 1, min = 1, step = 1),
+              selectInput('yourFileSwitch', 'Switch rows/columns', choices = c("No"=FALSE, "Yes"=TRUE))
               )
         )),
         column(7,
@@ -636,8 +636,9 @@
         fluidRow(column(12,
           column(2, div(actionButton("cluster_button_delete_analysis", label = "Delete"))),
           column(2, div(actionButton("cluster_button_deleteAll_analysis", label = "Delete All"))),
-          column(4),
+          column(2),
           column(2, div(downloadButton("cluster_button_saveDendogram", label = "Dendrogram"))), 
+          column(2),
           column(2, div(downloadButton("cluster_button_saveScaling2D", label = "Scaling")))
         ))
       )

Modified: pkg/yuimaGUI/inst/yuimaGUI/www/black.css
===================================================================
--- pkg/yuimaGUI/inst/yuimaGUI/www/black.css	2017-01-10 16:22:55 UTC (rev 563)
+++ pkg/yuimaGUI/inst/yuimaGUI/www/black.css	2017-01-10 23:31:35 UTC (rev 564)
@@ -248,8 +248,8 @@
 }
 
 #parametric_modal_rangeFraction .js-irs-0 .irs-single, .js-irs-0 .irs-bar-edge, .js-irs-0 .irs-bar {
-  background: #878792;
-  border-color: #282828;
+  background: #37435D;
+  border-color: #37435D;
 }
 
 

Modified: pkg/yuimaGUI/inst/yuimaGUI/www/white.css
===================================================================
--- pkg/yuimaGUI/inst/yuimaGUI/www/white.css	2017-01-10 16:22:55 UTC (rev 563)
+++ pkg/yuimaGUI/inst/yuimaGUI/www/white.css	2017-01-10 23:31:35 UTC (rev 564)
@@ -1,3 +1,13 @@
+.skin-blue .main-sidebar {
+                              background-color: black;
+                              font-family: "Times New Roman", Times, serif;
+                              }
+                              
+.content-wrapper, .right-side {
+                              background-color: #f0f4f5;
+                              }
+
+
 .hTitle {
   color: black;
   font-weight: bold;
@@ -222,8 +232,8 @@
 }
 
 #parametric_modal_rangeFraction .js-irs-0 .irs-single, .js-irs-0 .irs-bar-edge, .js-irs-0 .irs-bar {
-  background: #878792;
-  border-color: #282828;
+  background: #F0FBFF;
+  border-color: #F0FBFF;
 }
 
 



More information about the Yuima-commits mailing list