R与tcltk / tcltk2:使用TkTable显示大数据框时,性能会提高吗?

时间:2016-01-08 00:25:42

标签: r user-interface tcl tk ttk

请参阅以下两个编辑(稍后添加)...

我已将大数据框加载到内存中( 2.7 mio行和7列 - 74 MB RAM )。

如果我想通过tcltk2包函数tk2edit使用Tcl / Tk的Tktable widget来查看数据

  • 超过15分钟,直到窗口显示数据
  • R(包括Tcl / Tk)en plus消耗大约7 GB的RAM(!)

示例:

library(tcltk2)

my.data.frame <- data.frame(ID=1:2600000,
                            col1=rep(LETTERS,100000),
                            col2=rep(letters,1E5),
                            col3=26E5:1)       # about 40 MB of data

tk2edit(my.data.frame)

基本问题似乎是data.frame的每个单元必须通过两个嵌套循环(see the code in this tktable question)加载到tcl数组中。

tcltk2包的函数tk2edit以相同的方式工作,过度简化:

# my.data.frame contains a lot of rows...
for (i in 0:(dim(my.data.frame)[1])) {
        for (j in 0:(dim(my.data.frame)[2]-1)) {
                tclarray1[[i,j]] <- my.data.frame[i, j]
        }
}

问题:有没有办法优化使用tktable显示大数据框架,e。 G。通过避免嵌套循环?我只想查看数据(不需要编辑)......

tktable具有-variable选项,您可以在其中设置包含表的所有数据的tcl数组变量。所以我们“只”必须找到从R data.frame创建一个tcl数组的方法,“从R调用一个tcl”...

PS:这不是tcltk2包的问题,​​但似乎是如何将data.frame的数据“批量加载”为Tcl变量的一般问题......

PS2:好消息是Tktable似乎能够有效地显示如此多的数据(我可以滚动甚至编辑单元格而不会注意到任何严重的延迟)​​。

编辑1(09/01/2015):使用Tktable添加纯Tcl / Tk基准测试结果,并在数组中添加数据

我已经在Tcl / Tk中准备了一个简单的基准来测量填充类似Tktable的执行时间和内存消耗:

#!/usr/bin/env wish

package require Tktable

set rows 2700000
set columns 4

for {set row 0} {$row <= $rows} {incr row} {
  for {set column 0} {$column < $columns} {incr column} {
    if {$row == 0} {
      set data($row,$column) Titel$column
    } else {
      set data($row,$column) R${row}C${column}
    }
  }
}

ttk::frame .fr

table .fr.table -rows $rows -cols $columns -titlerows 1 -titlecols 0 -height 5 -width 25 -rowheight 1 -colwidth 9 -maxheight 100 -maxwidth 400 -selectmode extended -variable data -xscrollcommand {.fr.xscroll set} -yscrollcommand {.fr.yscroll set}

scrollbar .fr.xscroll -command {.fr.table xview} -orient horizontal
scrollbar .fr.yscroll -command {.fr.table yview}

pack .fr -fill both -expand 1
pack .fr.xscroll -side bottom -fill x
pack .fr.yscroll -side right -fill y
pack .fr.table -side right -fill both -expand 1

结果:

  • 内存消耗:3.2 GB
  • 表格显示的时间:15秒

结论: Tcl / Tk阵列浪费内存,但性能非常好(使用R和tcltk时15分钟的运行时间似乎是由R到Tcl / Tk通信开销引起的。

测试设置:Ubuntu 14.04 64位,16 GB RAM ......

编辑2(10/01/2015):将ttk :: treeview的纯Tcl / Tk基准测试结果与列表中的数据相加

为了比较Tktablettk::treeview的内存消耗,我编写了这段代码:

#!/usr/bin/env wish
set rows 2700000
set columns 4
set data {}
set colnames {}
for {set i 0} {$i < $columns} {incr i} {
  lappend colnames Title$i
}
for {set row 0} {$row <= $rows} {incr row} {
  set newrow {}
  for {set column 0} {$column < $columns} {incr column} {
      lappend newrow R${row}C${column}
  }
  lappend data $newrow
}

ttk::treeview .tv -columns $colnames -show headings -yscrollcommand {.sbY set} -xscrollcommand {.sbX set}
foreach Element $data {
   .tv insert {} end -values $Element
}
foreach column $colnames {
  .tv heading $column -text $column
}
ttk::scrollbar .sbY -command {.tv yview}
ttk::scrollbar .sbX -command {.tv xview} -orient horizontal
pack .sbY -side right -fill y
pack .sbX -side bottom -fill x
pack .tv -side left -fill both

结果:

  • 内存消耗:2 GB(其数据存储为列表:1.2 GB)
  • 表格显示的时间:15秒
  • 比较:10 mio行消耗7.2 GB的RAM,但选择一行需要几秒钟(2 - 5)然后(可能的原因:内部列表遍历?)

结论:

  • treeview的内存效率高于Tktable,因为它可以使用列表而不是数组。
  • 对于更大的数据大小(>几百万行),行选择很慢(结尾越慢越慢!)

1 个答案:

答案 0 :(得分:0)

我找到了一个可能的解决方案/解决方法在&#34;未绑定&#34;中使用Tktable (命令)模式

使用command Tktable选项,您可以指定每次在屏幕上显示单元格时调用的函数。这避免了#34; loading&#34;从R到Tcl的所有数据一下子改善了#34;启动&#34;时间并显着降低了TCL存储数组和列表的方式所造成的内存消耗。

这样一来,每次滚动一系列函数调用都会询问可见单元格的内容。

即使超过10百万,也适合我。行!

缺点:调用一个为每个单元格返回Tcl变量的R函数仍远没有效率。如果您是第一次滚动,则可以观看正在更新的单元格。 因此我仍在寻找R和Tcl / Tk之间的批量数据传输解决方案。

欢迎任何改善表现的建议!

我已经实现了一个小型演示(1行mio行和21列消耗1.2 GB RAM)并添加了一些按钮来测试不同的功能(如缓存)。

注意:长启动时间是由创建基础测试数据引起的,而不是由Tktable引起的!

library(tcltk)
library(data.table)

# Tktable example with -command ("unbound" mode) ---------------------------
# Doc: http://tktable.sourceforge.net/tktable/doc/tkTable.html

NUM.ROWS <- 1E6
NUM.COLS <- 20

# generate a big data.frame - this will take a while but is required for the demo
dt.data <- data.table(ID = 1:NUM.ROWS)

for (i in 1:NUM.COLS) {
  dt.data[, (paste("Col",i)) := paste0("R", 1:NUM.ROWS, " C", i)]
}

# Fill one cell with a long text containing special control characters to test the Tktable behaviour
dt.data[3,3 := "This is a long text with backslash \\ and \"quotes\"!"]

tclRequire("Tktable")

t <- tktoplevel()

tkwm.protocol(t, "WM_DELETE_WINDOW", function() tkdestroy(t))

# Function to return the current row and column as "calculated" value (without an underlying data "model")
calculated.data <- function(C) {
  # Function arguments  for Tcl "substitutions":
  # See:   http://tktable.sourceforge.net/tktable/doc/tkTable.html
  #   %c the column of the triggered cell.
  #   %C A convenience substitution for %r,%c.
  #   %i 0 for a read (get) and 1 for a write (set). Otherwise it is the current cursor position in the cell.
  #   %r the row of the triggered cell.
  return(tclVar(C))  # this does work!
}

# Function to return the content of a data.table for the current row and colum
data.frame.data <- function(r, c) {
  if( r == "0")
    return(tclVar(names(dt.data)[as.integer(c)+1]))             # First row contains the column names
  else
    return(tclVar(as.character(dt.data[as.integer(r)+1, as.integer(c)+1, with = FALSE])))   # Other rows are data rows
}

frame <- ttklabelframe(t, text = "Data:")
# Add the table to the window environment to ensure killing it when the window is closed (= no more phantom calls to the data command handler)
# Cache = TRUE: This greatly enhances speed performance when used with -command but uses extra memory.
t$env$table <- tkwidget(frame, "table", rows = NUM.ROWS, cols = NUM.COLS, titlerows = 1, selecttype = "cell", selectmode = "extended", command = calculated.data, cache = TRUE, yscrollcommand = function(...) tkset(scroll.y, ...), xscrollcommand = function(...) tkset(scroll.x, ...))

scroll.x <- ttkscrollbar(frame, orient = "horizontal", command=function(...) tkxview(t$env$table,...))  # command that performs the scrolling
scroll.y <- ttkscrollbar(frame, orient = "vertical", command=function(...) tkyview(t$env$table,...))  # command that performs the scrolling

buttons <- ttkframe(t)
btn.read.only <- ttkbutton(buttons, text = "make read only", command = function() tkconfigure(t$env$table, state = "disabled"))
btn.read.write <- ttkbutton(buttons, text = "make writable", command = function() tkconfigure(t$env$table, state = "normal"))
btn.clear.cache <- ttkbutton(buttons, text = "clear cache", command = function() tcl(t$env$table, "clear", "cache"))
btn.bind.data.frame <- ttkbutton(buttons, text = "Fill cells from R data.table",
                                 command = function() {
                                   tkconfigure(t$env$table, command = data.frame.data, rows = nrow(dt.data), cols = ncol(dt.data), titlerows = 1)
                                   tcl(t$env$table, "clear", "cache")
                                   tkwm.title(t,"Cells are filled from an R data.table")
                                 })
btn.bind.calc.value <- ttkbutton(buttons, text = "Fill cells with calculated values",
                                 command = function() {
                                   tkconfigure(t$env$table, command = calculated.data, rows = 1E5, cols = 40)
                                   tcl(t$env$table, "clear", "cache")
                                   tkwm.title(t,"Cells are calculated values (to test the highest performance possible)")
                                 })

tkgrid(btn.read.only, row = 0, column = 1)
tkgrid(btn.read.write, row = 0, column = 2)
tkgrid(btn.clear.cache, row = 0, column = 3)
tkgrid(btn.bind.data.frame, row = 0, column = 5)
tkgrid(btn.bind.calc.value, row = 0, column = 6)

tkpack(frame, fill = "both", expand = TRUE)
tkpack(scroll.x, fill = "x", expand = FALSE, side = "bottom")
tkpack(scroll.y, fill = "y", expand = FALSE, side = "right")
tkpack(t$env$table, fill = "both", expand = TRUE, side = "left")
tkpack(buttons, side = "bottom")