Skip to content

Commit

Permalink
Merge pull request #39 from rschuchmann/miro-2.5-icon-update
Browse files Browse the repository at this point in the history
Miro 2.5 icon update.
Also fix an issue with the year selection in the input settings.
  • Loading branch information
FFiand authored Jan 26, 2023
2 parents 28a9467 + ad4a51b commit 6535160
Show file tree
Hide file tree
Showing 5 changed files with 12 additions and 7 deletions.
Binary file modified data_times_miro/default.gdx
Binary file not shown.
15 changes: 10 additions & 5 deletions renderer_times_miro/mirowidget_scenddmap.R
Original file line number Diff line number Diff line change
Expand Up @@ -95,7 +95,7 @@ mirowidget_scenddmapOutput <- function(id, height = NULL, options = NULL, path =
),
tags$div(class = "add-row-btn-wrapper", title = "Add row",
actionButton(ns("addScenddmap"), label = NULL,
icon = icon("plus-circle"),
icon = icon("circle-plus"),
class = "add-row-btn")
),
tags$div(class = "table-styles",
Expand All @@ -106,7 +106,7 @@ mirowidget_scenddmapOutput <- function(id, height = NULL, options = NULL, path =
tags$h4("Extensions", class="table-header"),
tags$div(class = "add-row-btn-wrapper", title = "Add row",
actionButton(ns("addExtensions"), label = NULL,
icon = icon("plus-circle"),
icon = icon("circle-plus"),
class = "add-row-btn")
),
tags$div(class = "table-styles",
Expand All @@ -119,7 +119,7 @@ mirowidget_scenddmapOutput <- function(id, height = NULL, options = NULL, path =
tags$h4("Years for model run", class="table-header"),
tags$div(class = "add-row-btn-wrapper", title = "Add row",
actionButton(ns("addMilestonyr"), label = NULL,
icon = icon("plus-circle"),
icon = icon("circle-plus"),
class = "add-row-btn")
),
fluidRow(
Expand Down Expand Up @@ -176,7 +176,7 @@ mirowidget_scenddmapOutput <- function(id, height = NULL, options = NULL, path =
tags$h4("Solver options", class="table-header"),
tags$div(class = "add-row-btn-wrapper", title = "Add row",
actionButton(ns("addSolveropt"), label = NULL,
icon = icon("plus-circle"),
icon = icon("circle-plus"),
class = "add-row-btn")
),
tags$div(class = "table-styles",
Expand Down Expand Up @@ -555,7 +555,12 @@ renderMirowidget_scenddmap <- function(input, output, session, data, options = N
search = TRUE,
height = 400) %>%
hot_table(stretchH = "all", highlightRow = TRUE) %>%
hot_col(1, type = "autocomplete", source = c(if(length(rv$gmsbotime)) rv$gmsbotime else 1850:if(length(rv$gmseotime)) rv$gmseotime else 2200), strict = TRUE, allowInvalid = FALSE) %>%
hot_col(1, type = "autocomplete",
source = as.character(
(if(length(rv$gmsbotime)) rv$gmsbotime
else 1850):(if(length(rv$gmseotime))
rv$gmseotime else 2200)),
strict = TRUE, allowInvalid = FALSE) %>%
hot_cols(manualColumnResize = TRUE, columnSorting = TRUE) %>%
hot_col(col = 'Text', colWidths=0.001)
return(milestonyrTableTmp)
Expand Down
2 changes: 1 addition & 1 deletion times_miro.gms
Original file line number Diff line number Diff line change
Expand Up @@ -772,7 +772,7 @@ $eval.set GMSOBJ gmsObj.tl
$eval.set GMSRUNOPT gmsRunOpt.tl

$onecho > timesdriver.gms
$Title TIMES -- VERSION 4.6.1
$Title TIMES -- VERSION 4.6.9
option resLim=%GMSRESLIM%, profile=1, solveOpt=REPLACE, bRatio=%GMSBRATIO%;
option limRow=0, limCol=0, solPrint=OFF, solver=%GMSSOLVER%;
$offListing
Expand Down
Binary file modified times_miro.miroapp
Binary file not shown.
2 changes: 1 addition & 1 deletion times_model

0 comments on commit 6535160

Please sign in to comment.