search for: tkyview

Displaying 17 results from an estimated 17 matches for "tkyview".

2008 Nov 03
1
possible tcltk event loop problem
...dth=log.width, wrap="none")) .messages <- MessagesWindow() messagesXscroll <- ttkscrollbar(messagesFrame, orient="horizontal", command=function(...) tkxview(.messages, ...)) messagesYscroll <- ttkscrollbar(messagesFrame, command=function(...) tkyview(.messages, ...)) tkconfigure(.messages, xscrollcommand=function(...) tkset(messagesXscroll, ...)) tkconfigure(.messages, yscrollcommand=function(...) tkset(messagesYscroll, ...)) For the script window (note that "log" is a hold-over from earlier terminology): logFrame <-...
2007 Oct 08
3
tcltk scrollbar
...l.MainT<-tklabel(tt,text="Basic Manipulation",font=mainFont) tkgrid(lbl.MainT,sticky="nw") but.Browse<-tkbutton(tt,text=" Browse ",command=browse) but.Apply<-tkbutton(tt,text=" Apply ") scr1 <- tkscrollbar(tt, repeatinterval=5,command=function(...)tkyview(lsbDim1,...)) scr2 <- tkscrollbar(tt, repeatinterval=5,command=function(...)tkyview(lsbDim2,...)) lsbDim1<-tklistbox(tt,height=10,selectmode="multiple",yscrollcommand=function(...)tkset(scr1,...),background="white",exportselection=FALSE) lsbDim2<-tklistbox(tt,height=10,...
2000 Sep 29
1
Two tcltk questions and Re: tcltk package functionality
...ot;done") } -------------------------------------------------------------------------- Here are another two tcltk question: 1. I want to add a scrollbar along the right side of a text widget. This can be achieved by .Tk.ID(). Is there a way to avoid to call .Tk.ID --- perhaps by using tkyview? tk.test1 <- function(nmax=3){ library("tcltk") tl <- tktoplevel() tl.text <- tktext(tl) tl.yscroll <- tkscrollbar(tl) tkconfigure(tl.text, yscrollcommand=paste(.Tk.ID(tl.yscroll),"set" )) tkconfigure(tl.yscroll,...
2010 Mar 01
0
Multicolumn Listbox selectcommand trouble
...tk2column(mlb, "add", "listprice", label = "col3", width = 15) tk2column(mlb, "add", "categ", label = "col4", width = 20) # Collect data from insurance companies scr1 <- tkscrollbar(listings, repeatinterval = 5, command = function(...)tkyview(mlb,...)) tkgrid(mlb, scr1) tkgrid.configure(scr1, stick = "ns") tk2insert.multi(mlb, "end", idb[,c(1,2,3,4)]) tkpack(listings, side = "top") txtviewer <- tktext(editor, font = "courier", width = 66, height = 20, yscrollcommand = function(...)tkset(scr2,....
2012 Nov 20
1
tcl/tk problem with tklistbox,the " " character and Rcmdr.
...look at this code require(tcltk) tt<-tktoplevel() levels.list2 <-tklistbox(tt,selectmode="multiple",exportselection="FALSE", height=4, yscrollcommand=function(...)tkset(levels.list2.scroll,...)) levels.list2.scroll<-tkscrollbar(tt,repeatinterval=5,command=function(...)tkyview(levels.list2,...)) tkgrid(levels.list2,levels.list2.scroll) vec<-c("a","b",""," "," ") tkdelete(levels.list2,"0","end") for (var in vec) {tkinsert(levels.list2, "end", var)} tclvalue(tkget(levels.list2,"0...
2009 Aug 24
1
Copy & Paste from tktext on Mac
...functions to a text window under Mac OS X? This is what I'm doing with my text window: tt <- tktoplevel() txt <- tktext(tt, bg = "white", height=30, width=100, borderwidth=2) scr <- tkscrollbar(tt, orient = "vertical", repeatinterval = 1, command = function(...) tkyview(txt, ...)) tkconfigure(txt, yscrollcommand = function(...) tkset(scr, ...)) tkgrid(txt, column=0, row=0, columnspan=2, sticky="nwse") Session Info: R version 2.9.1 (2009-06-26) i386-apple-darwin8.11.1 locale: de_DE.UTF-8/de_DE.UTF-8/C/C/de_DE.UTF-8/de_DE.UTF-8 attached base packages: [...
2010 Jul 21
1
tcltk resizing when using tkgrid for layout
...le to use the tcltk package at all). require(tcltk) tt<- tktoplevel() xscr<- tkscrollbar(tt, repeatinterval=5,orient="horizontal", command=function(...)tkxview(txt,...)) yscr<- tkscrollbar(tt, repeatinterval=5, command=function(...)tkyview(txt,...)) txt<- tktext(tt,bg="white",font="courier", xscrollcommand=function(...)tkset(xscr,...),yscrollcommand=function(...)tkset(yscr,...), wrap="none") tkgrid(txt,yscr) tkgrid(xscr) tkgrid.configure(yscr,sticky="ns") tkgrid.configure(xscr,stic...
2003 Jun 06
4
stuck tcltk scrollbars under Windows XP
...away when I remove the calls to tkgrab() and tkgrab.release(). You can test for the problem with the following code: window1 <- tktoplevel() window2 <- tktoplevel() xFrame <- tkframe(window2) xScroll <- tkscrollbar(xFrame, repeatinterval=5, command=function(...) tkyview(xBox, ...)) xBox <- tklistbox(xFrame, height=4, selectmode="single", background="white", exportselection="FALSE", yscrollcommand=function(...) tkset(xScroll, ...)) for (x in letters) tkinsert(xBox, "end", x) onOK <- func...
2001 Feb 14
2
help with tcltk
Hallo! Can anyone explain to me how to add a vert. scrollbar to a listbox using tcltk please? Thanks -- Frank Gerrit Zoellner -.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.- r-help mailing list -- Read http://www.ci.tuwien.ac.at/~hornik/R/R-FAQ.html Send "info", "help", or "[un]subscribe" (in the "body", not the subject
2002 Aug 13
1
tcltk - text widget with a scrollbar?
Can anyone show me how to connect a scrollbar to a text widget using the tcltk library? I'm confused about how to make sure the two widgets know about each other and how to set up the appropriate call-backs for scrolling. Mike -.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.- r-help mailing list -- Read http://www.ci.tuwien.ac.at/~hornik/R/R-FAQ.html Send
2005 Sep 02
1
tcltk - automatically moving cursor to last line of tktext box - how?
Hi; I have a program which writes lines to a tktext box (of height, say, 10) with tkinsert(txto, "end", paste(so,"\n")) I would like my program to be such that it automatically scrolls down through the text box when it is full so that I always see the last 10 lines written. Can anyone help on this? Best regards S??ren
2007 Feb 14
1
monitor a simulation with a special console box?
I like to monitor simulation by reporting some current values to the console, every 25th iteration say. I think it might be nice to have that appear in a separate window. Anyone know how? regards, David Farrar New River Analytic [[alternative HTML version deleted]]
2006 Oct 21
0
tcltk: multiple listboxes, selection
...(frame.y, height = 20, #length(yvals) / yvals.field.count, yscrollcommand=function(...) tkset(scr.y,...), width = 50, selectmode = "extended", background = "white") scr.y <- tkscrollbar(frame.y, repeatinterval = 5, command = function(...) tkyview(tl.y, ...)) for(i in seq(from=1, to=length(yvals), by=yvals.field.count)) { tkinsert(tl.y, "end", yvals[[i]]) } tkselection.set(tl.y, 0) tkgrid(tl.y, scr.y, sticky="news") # Packing tkgrid(frame.x, frame.y, sticky="news") #side = "left&quo...
2009 Oct 12
0
tktext-window smaller than text
...n't want the window to just wrap the line, but to belong to scrollbar that is able to scroll to the end of the text. tt <- tktoplevel() txt <- tktext(tt, width=100, height=30) scrergVert <- tkscrollbar(tt, orient = "vertical", repeatinterval = 1, command = function(...) tkyview(txt, ...)) tkconfigure(txt, yscrollcommand = function(...) tkset(scrergVert, ...)) scrergHor <- tkscrollbar(tt, orient = "horizontal", repeatinterval = 1, command = function(...) tkxview(txt, ...)) tkconfigure(txt, xscrollcommand = function(...) tkset(scrergHor, ...)) tkgrid(txt, co...
2010 Jun 22
0
Scrolling a tkcanvas non-starter
...forum, but other than that, I cannot find any documentation or online help in this area. tt <- tktoplevel() # Create a new toplevel window tkwm.geometry(tt, "700x600") tkwm.geometry(tt,"+5+5") ... yscr <- tkscrollbar(tt,orient="vertical", command=function(...) tkyview(column1,...) ) column1 = tkcanvas(tt, height=200, yscrollcommand = function(...) tkset(yscr, ...)) divBandListbox1 = tklistbox(column1, width=65, height=15, selectmode="single") divBandListbox2 = tklistbox(column1, width=65,height=15, selectmode="single") divBandListbox3 = tkl...
2003 Nov 03
0
problem with fix() called from Rcmdr
...riable containing the name of the "active" data frame, logger() just echoes the command to the R console logger <- function(command){ if (tclvalue(.logCommands) == "1") { tkinsert(.log, "end", paste(command,"\n", sep="")) tkyview.moveto(.log, 1) } lines <- strsplit(command, "\n")[[1]] for (line in lines) cat(paste("\nR-cmdr>", line, "\n")) command } and JustDoIt() is defined as follows: justDoIt <- function(command) { result <- try(eval(parse(tex...
2008 Oct 30
3
using yscrollcommand in tkcanvas crashes R (PR#13231)
Full_Name: Sundar Dorai-Raj Version: 2.8.0 OS: Windows Submission from: (NULL) (76.220.41.126) The following code crashes R: library(tcltk) tt <- tktoplevel() tc <- tkcanvas(tt, yscrollcommand = function(...) tkset(ts, ...)) > sessionInfo() R version 2.8.0 (2008-10-20) i386-pc-mingw32 locale: LC_COLLATE=English_United States.1252;LC_CTYPE=English_United