繁体   English   中英

R与tcltk / tcltk2:使用TkTable显示大data.frame时,提高了慢速性能吗?

[英]R with tcltk/tcltk2: Improve slow performance when displaying big data.frame with TkTable?

请在下面看到两个修改(稍后添加)...

我已经将一个大的data.frame加载到内存中( 2.7 mio行和7列-74 MB RAM )。

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

  • 直到显示数据窗口需要15分钟以上
  • R(包括Tcl / Tk)占用了大约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的每个单元必须通过两个嵌套循环加载到tcl数组中( 请参阅此tktable问题中的代码 )。

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优化显示大data.frames,例如通过避免嵌套循环? 我只想查看数据(无需编辑)...

tktable-variable选项,您可以设置包含该表的所有数据TCL数组变量。 因此,我们“仅”必须找到一种方法,通过“从R调用tcl”来从R data.frame创建tcl数组...

PS:这不是tcltk2软件包的问题,​​但似乎是一个普遍的问题,如何将data.frame的数据“批量加载”到Tcl变量中...

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


编辑1( Tktable月1日):将纯Tcl / Tk基准测试结果与Tktable和数组中的数据Tktable

我已经在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 Bit with 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)(可能的原因:内部列表遍历吗?)

结论:

  • treeviewTktable更具内存效率,因为它可以使用列表而不是数组。
  • 对于更大的数据大小(>几百万行),行选择速度较慢(最后的行越多,速度就越慢!)

我发现在“未绑定”(命令)模式下使用Tktable一种可能的解决方案/解决方法。

使用Tktablecommand选项,您可以指定每次在屏幕上显示一个单元格时都会调用的函数。 这避免了一次将所有数据从R加载到Tcl的情况,从而缩短了“启动”时间,并显着减少了TCL存储阵列和列表的方式所导致的内存消耗。

这样,每次滚动一系列函数时,都会要求提供可见单元格的内容。

即使超过10毫欧,它也对我有用。 行!

缺点:调用R函数返回每个单元格的Tcl变量仍然远远不够有效。 如果您是第一次滚动,则可以观看正在更新的单元格。 因此,我仍在寻找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")

暂无
暂无

声明:本站的技术帖子网页,遵循CC BY-SA 4.0协议,如果您需要转载,请注明本站网址或者原文地址。任何问题请咨询:yoyou2525@163.com.

 
粤ICP备18138465号  © 2020-2024 STACKOOM.COM