Skip to content

Commit

Permalink
changed time label color; updated default argument to renderReactLog
Browse files Browse the repository at this point in the history
  • Loading branch information
bborgesr committed Mar 21, 2016
1 parent bdc6554 commit c637bba
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 2 deletions.
2 changes: 1 addition & 1 deletion R/graph.R
Expand Up @@ -49,7 +49,7 @@ showReactLog <- function(time = TRUE) {
utils::browseURL(renderReactLog(time = as.logical(time)))
}

renderReactLog <- function(sessionToken = NULL, time) {
renderReactLog <- function(sessionToken = NULL, time = TRUE) {
templateFile <- system.file('www/reactive-graph.html', package='shiny')
html <- paste(readLines(templateFile, warn=FALSE), collapse='\r\n')
tc <- textConnection(NULL, 'w')
Expand Down
2 changes: 1 addition & 1 deletion inst/www/reactive-graph.html
Expand Up @@ -44,7 +44,7 @@
.node .tspanTime{
font-weight: bold;
font-size: 87%;
fill: #a7d9b7;
fill: #444444;
user-select: none;
transition: fill 0.75s ease;
}
Expand Down

0 comments on commit c637bba

Please sign in to comment.