Skip to content

Commit

Permalink
tweaks to data viewer rownames synthesis
Browse files Browse the repository at this point in the history
  • Loading branch information
kevinushey committed Nov 3, 2017
1 parent adfed32 commit e2b9ba1
Showing 1 changed file with 3 additions and 2 deletions.
5 changes: 3 additions & 2 deletions src/cpp/session/modules/SessionDataViewer.R
Original file line number Diff line number Diff line change
Expand Up @@ -183,9 +183,10 @@
if (is.data.frame(x))
{
info <- .row_names_info(x, type = 0L)
if (is.na(info)[[1]])
if (is.integer(info) && is.na(info[[1]]))
{
range <- seq(from = start, to = start + len)
n <- info[[2]]
range <- seq(from = start, to = min(n, start + len))
return(as.character(range))
}
}
Expand Down

0 comments on commit e2b9ba1

Please sign in to comment.