massive update, probably broken
[dotfiles/.git] / .config / coc / extensions / coc-python-data / languageServer.0.5.59 / Typeshed / stdlib / 3 / tkinter / __init__.pyi
1 from typing import Any\r
2 from tkinter.constants import *  # noqa: F403\r
3 \r
4 TclError = ...  # type: Any\r
5 wantobjects = ...  # type: Any\r
6 TkVersion = ...  # type: Any\r
7 TclVersion = ...  # type: Any\r
8 READABLE = ...  # type: Any\r
9 WRITABLE = ...  # type: Any\r
10 EXCEPTION = ...  # type: Any\r
11 \r
12 class Event: ...\r
13 \r
14 def NoDefaultRoot(): ...\r
15 \r
16 class Variable:\r
17     def __init__(self, master=None, value=None, name=None): ...\r
18     def __del__(self): ...\r
19     def set(self, value): ...\r
20     initialize = ...  # type: Any\r
21     def get(self): ...\r
22     def trace_variable(self, mode, callback): ...\r
23     trace = ...  # type: Any\r
24     def trace_vdelete(self, mode, cbname): ...\r
25     def trace_vinfo(self): ...\r
26     def __eq__(self, other): ...\r
27 \r
28 class StringVar(Variable):\r
29     def __init__(self, master=None, value=None, name=None): ...\r
30     def get(self): ...\r
31 \r
32 class IntVar(Variable):\r
33     def __init__(self, master=None, value=None, name=None): ...\r
34     def get(self): ...\r
35 \r
36 class DoubleVar(Variable):\r
37     def __init__(self, master=None, value=None, name=None): ...\r
38     def get(self): ...\r
39 \r
40 class BooleanVar(Variable):\r
41     def __init__(self, master=None, value=None, name=None): ...\r
42     def set(self, value): ...\r
43     initialize = ...  # type: Any\r
44     def get(self): ...\r
45 \r
46 def mainloop(n=0): ...\r
47 \r
48 getint = ...  # type: Any\r
49 getdouble = ...  # type: Any\r
50 \r
51 def getboolean(s): ...\r
52 \r
53 class Misc:\r
54     def destroy(self): ...\r
55     def deletecommand(self, name): ...\r
56     def tk_strictMotif(self, boolean=None): ...\r
57     def tk_bisque(self): ...\r
58     def tk_setPalette(self, *args, **kw): ...\r
59     def tk_menuBar(self, *args): ...\r
60     def wait_variable(self, name: str = ...): ...\r
61     waitvar = ...  # type: Any\r
62     def wait_window(self, window=None): ...\r
63     def wait_visibility(self, window=None): ...\r
64     def setvar(self, name: str = ..., value: str = ...): ...\r
65     def getvar(self, name: str = ...): ...\r
66     def getint(self, s): ...\r
67     def getdouble(self, s): ...\r
68     def getboolean(self, s): ...\r
69     def focus_set(self): ...\r
70     focus = ...  # type: Any\r
71     def focus_force(self): ...\r
72     def focus_get(self): ...\r
73     def focus_displayof(self): ...\r
74     def focus_lastfor(self): ...\r
75     def tk_focusFollowsMouse(self): ...\r
76     def tk_focusNext(self): ...\r
77     def tk_focusPrev(self): ...\r
78     def after(self, ms, func=None, *args): ...\r
79     def after_idle(self, func, *args): ...\r
80     def after_cancel(self, id): ...\r
81     def bell(self, displayof=0): ...\r
82     def clipboard_get(self, **kw): ...\r
83     def clipboard_clear(self, **kw): ...\r
84     def clipboard_append(self, string, **kw): ...\r
85     def grab_current(self): ...\r
86     def grab_release(self): ...\r
87     def grab_set(self): ...\r
88     def grab_set_global(self): ...\r
89     def grab_status(self): ...\r
90     def option_add(self, pattern, value, priority=None): ...\r
91     def option_clear(self): ...\r
92     def option_get(self, name, className): ...\r
93     def option_readfile(self, fileName, priority=None): ...\r
94     def selection_clear(self, **kw): ...\r
95     def selection_get(self, **kw): ...\r
96     def selection_handle(self, command, **kw): ...\r
97     def selection_own(self, **kw): ...\r
98     def selection_own_get(self, **kw): ...\r
99     def send(self, interp, cmd, *args): ...\r
100     def lower(self, belowThis=None): ...\r
101     def tkraise(self, aboveThis=None): ...\r
102     lift = ...  # type: Any\r
103     def winfo_atom(self, name, displayof=0): ...\r
104     def winfo_atomname(self, id, displayof=0): ...\r
105     def winfo_cells(self): ...\r
106     def winfo_children(self): ...\r
107     def winfo_class(self): ...\r
108     def winfo_colormapfull(self): ...\r
109     def winfo_containing(self, rootX, rootY, displayof=0): ...\r
110     def winfo_depth(self): ...\r
111     def winfo_exists(self): ...\r
112     def winfo_fpixels(self, number): ...\r
113     def winfo_geometry(self): ...\r
114     def winfo_height(self): ...\r
115     def winfo_id(self): ...\r
116     def winfo_interps(self, displayof=0): ...\r
117     def winfo_ismapped(self): ...\r
118     def winfo_manager(self): ...\r
119     def winfo_name(self): ...\r
120     def winfo_parent(self): ...\r
121     def winfo_pathname(self, id, displayof=0): ...\r
122     def winfo_pixels(self, number): ...\r
123     def winfo_pointerx(self): ...\r
124     def winfo_pointerxy(self): ...\r
125     def winfo_pointery(self): ...\r
126     def winfo_reqheight(self): ...\r
127     def winfo_reqwidth(self): ...\r
128     def winfo_rgb(self, color): ...\r
129     def winfo_rootx(self): ...\r
130     def winfo_rooty(self): ...\r
131     def winfo_screen(self): ...\r
132     def winfo_screencells(self): ...\r
133     def winfo_screendepth(self): ...\r
134     def winfo_screenheight(self): ...\r
135     def winfo_screenmmheight(self): ...\r
136     def winfo_screenmmwidth(self): ...\r
137     def winfo_screenvisual(self): ...\r
138     def winfo_screenwidth(self): ...\r
139     def winfo_server(self): ...\r
140     def winfo_toplevel(self): ...\r
141     def winfo_viewable(self): ...\r
142     def winfo_visual(self): ...\r
143     def winfo_visualid(self): ...\r
144     def winfo_visualsavailable(self, includeids=0): ...\r
145     def winfo_vrootheight(self): ...\r
146     def winfo_vrootwidth(self): ...\r
147     def winfo_vrootx(self): ...\r
148     def winfo_vrooty(self): ...\r
149     def winfo_width(self): ...\r
150     def winfo_x(self): ...\r
151     def winfo_y(self): ...\r
152     def update(self): ...\r
153     def update_idletasks(self): ...\r
154     def bindtags(self, tagList=None): ...\r
155     def bind(self, sequence=None, func=None, add=None): ...\r
156     def unbind(self, sequence, funcid=None): ...\r
157     def bind_all(self, sequence=None, func=None, add=None): ...\r
158     def unbind_all(self, sequence): ...\r
159     def bind_class(self, className, sequence=None, func=None, add=None): ...\r
160     def unbind_class(self, className, sequence): ...\r
161     def mainloop(self, n=0): ...\r
162     def quit(self): ...\r
163     def nametowidget(self, name): ...\r
164     register = ...  # type: Any\r
165     def configure(self, cnf=None, **kw): ...\r
166     config = ...  # type: Any\r
167     def cget(self, key): ...\r
168     __getitem__ = ...  # type: Any\r
169     def __setitem__(self, key, value): ...\r
170     def keys(self): ...\r
171     def pack_propagate(self, flag=...): ...\r
172     propagate = ...  # type: Any\r
173     def pack_slaves(self): ...\r
174     slaves = ...  # type: Any\r
175     def place_slaves(self): ...\r
176     def grid_anchor(self, anchor=None): ...\r
177     anchor = ...  # type: Any\r
178     def grid_bbox(self, column=None, row=None, col2=None, row2=None): ...\r
179     bbox = ...  # type: Any\r
180     def grid_columnconfigure(self, index, cnf=..., **kw): ...\r
181     columnconfigure = ...  # type: Any\r
182     def grid_location(self, x, y): ...\r
183     def grid_propagate(self, flag=...): ...\r
184     def grid_rowconfigure(self, index, cnf=..., **kw): ...\r
185     rowconfigure = ...  # type: Any\r
186     def grid_size(self): ...\r
187     size = ...  # type: Any\r
188     def grid_slaves(self, row=None, column=None): ...\r
189     def event_add(self, virtual, *sequences): ...\r
190     def event_delete(self, virtual, *sequences): ...\r
191     def event_generate(self, sequence, **kw): ...\r
192     def event_info(self, virtual=None): ...\r
193     def image_names(self): ...\r
194     def image_types(self): ...\r
195 \r
196 class CallWrapper:\r
197     func = ...  # type: Any\r
198     subst = ...  # type: Any\r
199     widget = ...  # type: Any\r
200     def __init__(self, func, subst, widget): ...\r
201     def __call__(self, *args): ...\r
202 \r
203 class XView:\r
204     def xview(self, *args): ...\r
205     def xview_moveto(self, fraction): ...\r
206     def xview_scroll(self, number, what): ...\r
207 \r
208 class YView:\r
209     def yview(self, *args): ...\r
210     def yview_moveto(self, fraction): ...\r
211     def yview_scroll(self, number, what): ...\r
212 \r
213 class Wm:\r
214     def wm_aspect(self, minNumer=None, minDenom=None, maxNumer=None, maxDenom=None): ...\r
215     aspect = ...  # type: Any\r
216     def wm_attributes(self, *args): ...\r
217     attributes = ...  # type: Any\r
218     def wm_client(self, name=None): ...\r
219     client = ...  # type: Any\r
220     def wm_colormapwindows(self, *wlist): ...\r
221     colormapwindows = ...  # type: Any\r
222     def wm_command(self, value=None): ...\r
223     command = ...  # type: Any\r
224     def wm_deiconify(self): ...\r
225     deiconify = ...  # type: Any\r
226     def wm_focusmodel(self, model=None): ...\r
227     focusmodel = ...  # type: Any\r
228     def wm_forget(self, window): ...\r
229     forget = ...  # type: Any\r
230     def wm_frame(self): ...\r
231     frame = ...  # type: Any\r
232     def wm_geometry(self, newGeometry=None): ...\r
233     geometry = ...  # type: Any\r
234     def wm_grid(self, baseWidth=None, baseHeight=None, widthInc=None, heightInc=None): ...\r
235     grid = ...  # type: Any\r
236     def wm_group(self, pathName=None): ...\r
237     group = ...  # type: Any\r
238     def wm_iconbitmap(self, bitmap=None, default=None): ...\r
239     iconbitmap = ...  # type: Any\r
240     def wm_iconify(self): ...\r
241     iconify = ...  # type: Any\r
242     def wm_iconmask(self, bitmap=None): ...\r
243     iconmask = ...  # type: Any\r
244     def wm_iconname(self, newName=None): ...\r
245     iconname = ...  # type: Any\r
246     def wm_iconphoto(self, default=False, *args): ...\r
247     iconphoto = ...  # type: Any\r
248     def wm_iconposition(self, x=None, y=None): ...\r
249     iconposition = ...  # type: Any\r
250     def wm_iconwindow(self, pathName=None): ...\r
251     iconwindow = ...  # type: Any\r
252     def wm_manage(self, widget): ...\r
253     manage = ...  # type: Any\r
254     def wm_maxsize(self, width=None, height=None): ...\r
255     maxsize = ...  # type: Any\r
256     def wm_minsize(self, width=None, height=None): ...\r
257     minsize = ...  # type: Any\r
258     def wm_overrideredirect(self, boolean=None): ...\r
259     overrideredirect = ...  # type: Any\r
260     def wm_positionfrom(self, who=None): ...\r
261     positionfrom = ...  # type: Any\r
262     def wm_protocol(self, name=None, func=None): ...\r
263     protocol = ...  # type: Any\r
264     def wm_resizable(self, width=None, height=None): ...\r
265     resizable = ...  # type: Any\r
266     def wm_sizefrom(self, who=None): ...\r
267     sizefrom = ...  # type: Any\r
268     def wm_state(self, newstate=None): ...\r
269     state = ...  # type: Any\r
270     def wm_title(self, string=None): ...\r
271     title = ...  # type: Any\r
272     def wm_transient(self, master=None): ...\r
273     transient = ...  # type: Any\r
274     def wm_withdraw(self): ...\r
275     withdraw = ...  # type: Any\r
276 \r
277 class Tk(Misc, Wm):\r
278     master = ...  # type: Any\r
279     children = ...  # type: Any\r
280     tk = ...  # type: Any\r
281     def __init__(self, screenName=None, baseName=None, className: str = ..., useTk=1, sync=0, use=None) -> None: ...\r
282     def loadtk(self): ...\r
283     def destroy(self): ...\r
284     def readprofile(self, baseName, className): ...\r
285     def report_callback_exception(self, exc, val, tb): ...\r
286     def __getattr__(self, attr): ...\r
287 \r
288 def Tcl(screenName=None, baseName=None, className: str = ..., useTk=0): ...\r
289 \r
290 class Pack:\r
291     def pack_configure(self, cnf=..., **kw): ...\r
292     pack = ...  # type: Any\r
293     def pack_forget(self): ...\r
294     forget = ...  # type: Any\r
295     def pack_info(self): ...\r
296     info = ...  # type: Any\r
297     propagate = ...  # type: Any\r
298     slaves = ...  # type: Any\r
299 \r
300 class Place:\r
301     def place_configure(self, cnf=..., **kw): ...\r
302     place = ...  # type: Any\r
303     def place_forget(self): ...\r
304     forget = ...  # type: Any\r
305     def place_info(self): ...\r
306     info = ...  # type: Any\r
307     slaves = ...  # type: Any\r
308 \r
309 class Grid:\r
310     def grid_configure(self, cnf=..., **kw): ...\r
311     grid = ...  # type: Any\r
312     bbox = ...  # type: Any\r
313     columnconfigure = ...  # type: Any\r
314     def grid_forget(self): ...\r
315     forget = ...  # type: Any\r
316     def grid_remove(self): ...\r
317     def grid_info(self): ...\r
318     info = ...  # type: Any\r
319     location = ...  # type: Any\r
320     propagate = ...  # type: Any\r
321     rowconfigure = ...  # type: Any\r
322     size = ...  # type: Any\r
323     slaves = ...  # type: Any\r
324 \r
325 class BaseWidget(Misc):\r
326     widgetName = ...  # type: Any\r
327     def __init__(self, master, widgetName, cnf=..., kw=..., extra=...): ...\r
328     def destroy(self): ...\r
329 \r
330 class Widget(BaseWidget, Pack, Place, Grid): ...\r
331 \r
332 class Toplevel(BaseWidget, Wm):\r
333     def __init__(self, master=None, cnf=..., **kw): ...\r
334 \r
335 class Button(Widget):\r
336     def __init__(self, master=None, cnf=..., **kw): ...\r
337     def flash(self): ...\r
338     def invoke(self): ...\r
339 \r
340 class Canvas(Widget, XView, YView):\r
341     def __init__(self, master=None, cnf=..., **kw): ...\r
342     def addtag(self, *args): ...\r
343     def addtag_above(self, newtag, tagOrId): ...\r
344     def addtag_all(self, newtag): ...\r
345     def addtag_below(self, newtag, tagOrId): ...\r
346     def addtag_closest(self, newtag, x, y, halo=None, start=None): ...\r
347     def addtag_enclosed(self, newtag, x1, y1, x2, y2): ...\r
348     def addtag_overlapping(self, newtag, x1, y1, x2, y2): ...\r
349     def addtag_withtag(self, newtag, tagOrId): ...\r
350     def bbox(self, *args): ...\r
351     def tag_unbind(self, tagOrId, sequence, funcid=None): ...\r
352     def tag_bind(self, tagOrId, sequence=None, func=None, add=None): ...\r
353     def canvasx(self, screenx, gridspacing=None): ...\r
354     def canvasy(self, screeny, gridspacing=None): ...\r
355     def coords(self, *args): ...\r
356     def create_arc(self, *args, **kw): ...\r
357     def create_bitmap(self, *args, **kw): ...\r
358     def create_image(self, *args, **kw): ...\r
359     def create_line(self, *args, **kw): ...\r
360     def create_oval(self, *args, **kw): ...\r
361     def create_polygon(self, *args, **kw): ...\r
362     def create_rectangle(self, *args, **kw): ...\r
363     def create_text(self, *args, **kw): ...\r
364     def create_window(self, *args, **kw): ...\r
365     def dchars(self, *args): ...\r
366     def delete(self, *args): ...\r
367     def dtag(self, *args): ...\r
368     def find(self, *args): ...\r
369     def find_above(self, tagOrId): ...\r
370     def find_all(self): ...\r
371     def find_below(self, tagOrId): ...\r
372     def find_closest(self, x, y, halo=None, start=None): ...\r
373     def find_enclosed(self, x1, y1, x2, y2): ...\r
374     def find_overlapping(self, x1, y1, x2, y2): ...\r
375     def find_withtag(self, tagOrId): ...\r
376     def focus(self, *args): ...\r
377     def gettags(self, *args): ...\r
378     def icursor(self, *args): ...\r
379     def index(self, *args): ...\r
380     def insert(self, *args): ...\r
381     def itemcget(self, tagOrId, option): ...\r
382     def itemconfigure(self, tagOrId, cnf=None, **kw): ...\r
383     itemconfig = ...  # type: Any\r
384     def tag_lower(self, *args): ...\r
385     lower = ...  # type: Any\r
386     def move(self, *args): ...\r
387     def postscript(self, cnf=..., **kw): ...\r
388     def tag_raise(self, *args): ...\r
389     lift = ...  # type: Any\r
390     def scale(self, *args): ...\r
391     def scan_mark(self, x, y): ...\r
392     def scan_dragto(self, x, y, gain=10): ...\r
393     def select_adjust(self, tagOrId, index): ...\r
394     def select_clear(self): ...\r
395     def select_from(self, tagOrId, index): ...\r
396     def select_item(self): ...\r
397     def select_to(self, tagOrId, index): ...\r
398     def type(self, tagOrId): ...\r
399 \r
400 class Checkbutton(Widget):\r
401     def __init__(self, master=None, cnf=..., **kw): ...\r
402     def deselect(self): ...\r
403     def flash(self): ...\r
404     def invoke(self): ...\r
405     def select(self): ...\r
406     def toggle(self): ...\r
407 \r
408 class Entry(Widget, XView):\r
409     def __init__(self, master=None, cnf=..., **kw): ...\r
410     def delete(self, first, last=None): ...\r
411     def get(self): ...\r
412     def icursor(self, index): ...\r
413     def index(self, index): ...\r
414     def insert(self, index, string): ...\r
415     def scan_mark(self, x): ...\r
416     def scan_dragto(self, x): ...\r
417     def selection_adjust(self, index): ...\r
418     select_adjust = ...  # type: Any\r
419     def selection_clear(self): ...\r
420     select_clear = ...  # type: Any\r
421     def selection_from(self, index): ...\r
422     select_from = ...  # type: Any\r
423     def selection_present(self): ...\r
424     select_present = ...  # type: Any\r
425     def selection_range(self, start, end): ...\r
426     select_range = ...  # type: Any\r
427     def selection_to(self, index): ...\r
428     select_to = ...  # type: Any\r
429 \r
430 class Frame(Widget):\r
431     def __init__(self, master=None, cnf=..., **kw): ...\r
432 \r
433 class Label(Widget):\r
434     def __init__(self, master=None, cnf=..., **kw): ...\r
435 \r
436 class Listbox(Widget, XView, YView):\r
437     def __init__(self, master=None, cnf=..., **kw): ...\r
438     def activate(self, index): ...\r
439     def bbox(self, index): ...\r
440     def curselection(self): ...\r
441     def delete(self, first, last=None): ...\r
442     def get(self, first, last=None): ...\r
443     def index(self, index): ...\r
444     def insert(self, index, *elements): ...\r
445     def nearest(self, y): ...\r
446     def scan_mark(self, x, y): ...\r
447     def scan_dragto(self, x, y): ...\r
448     def see(self, index): ...\r
449     def selection_anchor(self, index): ...\r
450     select_anchor = ...  # type: Any\r
451     def selection_clear(self, first, last=None): ...\r
452     select_clear = ...  # type: Any\r
453     def selection_includes(self, index): ...\r
454     select_includes = ...  # type: Any\r
455     def selection_set(self, first, last=None): ...\r
456     select_set = ...  # type: Any\r
457     def size(self): ...\r
458     def itemcget(self, index, option): ...\r
459     def itemconfigure(self, index, cnf=None, **kw): ...\r
460     itemconfig = ...  # type: Any\r
461 \r
462 class Menu(Widget):\r
463     def __init__(self, master=None, cnf=..., **kw): ...\r
464     def tk_popup(self, x, y, entry: str = ...): ...\r
465     def tk_bindForTraversal(self): ...\r
466     def activate(self, index): ...\r
467     def add(self, itemType, cnf=..., **kw): ...\r
468     def add_cascade(self, cnf=..., **kw): ...\r
469     def add_checkbutton(self, cnf=..., **kw): ...\r
470     def add_command(self, cnf=..., **kw): ...\r
471     def add_radiobutton(self, cnf=..., **kw): ...\r
472     def add_separator(self, cnf=..., **kw): ...\r
473     def insert(self, index, itemType, cnf=..., **kw): ...\r
474     def insert_cascade(self, index, cnf=..., **kw): ...\r
475     def insert_checkbutton(self, index, cnf=..., **kw): ...\r
476     def insert_command(self, index, cnf=..., **kw): ...\r
477     def insert_radiobutton(self, index, cnf=..., **kw): ...\r
478     def insert_separator(self, index, cnf=..., **kw): ...\r
479     def delete(self, index1, index2=None): ...\r
480     def entrycget(self, index, option): ...\r
481     def entryconfigure(self, index, cnf=None, **kw): ...\r
482     entryconfig = ...  # type: Any\r
483     def index(self, index): ...\r
484     def invoke(self, index): ...\r
485     def post(self, x, y): ...\r
486     def type(self, index): ...\r
487     def unpost(self): ...\r
488     def xposition(self, index): ...\r
489     def yposition(self, index): ...\r
490 \r
491 class Menubutton(Widget):\r
492     def __init__(self, master=None, cnf=..., **kw): ...\r
493 \r
494 class Message(Widget):\r
495     def __init__(self, master=None, cnf=..., **kw): ...\r
496 \r
497 class Radiobutton(Widget):\r
498     def __init__(self, master=None, cnf=..., **kw): ...\r
499     def deselect(self): ...\r
500     def flash(self): ...\r
501     def invoke(self): ...\r
502     def select(self): ...\r
503 \r
504 class Scale(Widget):\r
505     def __init__(self, master=None, cnf=..., **kw): ...\r
506     def get(self): ...\r
507     def set(self, value): ...\r
508     def coords(self, value=None): ...\r
509     def identify(self, x, y): ...\r
510 \r
511 class Scrollbar(Widget):\r
512     def __init__(self, master=None, cnf=..., **kw): ...\r
513     def activate(self, index=None): ...\r
514     def delta(self, deltax, deltay): ...\r
515     def fraction(self, x, y): ...\r
516     def identify(self, x, y): ...\r
517     def get(self): ...\r
518     def set(self, first, last): ...\r
519 \r
520 class Text(Widget, XView, YView):\r
521     def __init__(self, master=None, cnf=..., **kw): ...\r
522     def bbox(self, index): ...\r
523     def compare(self, index1, op, index2): ...\r
524     def count(self, index1, index2, *args): ...\r
525     def debug(self, boolean=None): ...\r
526     def delete(self, index1, index2=None): ...\r
527     def dlineinfo(self, index): ...\r
528     def dump(self, index1, index2=None, command=None, **kw): ...\r
529     def edit(self, *args): ...\r
530     def edit_modified(self, arg=None): ...\r
531     def edit_redo(self): ...\r
532     def edit_reset(self): ...\r
533     def edit_separator(self): ...\r
534     def edit_undo(self): ...\r
535     def get(self, index1, index2=None): ...\r
536     def image_cget(self, index, option): ...\r
537     def image_configure(self, index, cnf=None, **kw): ...\r
538     def image_create(self, index, cnf=..., **kw): ...\r
539     def image_names(self): ...\r
540     def index(self, index): ...\r
541     def insert(self, index, chars, *args): ...\r
542     def mark_gravity(self, markName, direction=None): ...\r
543     def mark_names(self): ...\r
544     def mark_set(self, markName, index): ...\r
545     def mark_unset(self, *markNames): ...\r
546     def mark_next(self, index): ...\r
547     def mark_previous(self, index): ...\r
548     def peer_create(self, newPathName, cnf=..., **kw): ...\r
549     def peer_names(self): ...\r
550     def replace(self, index1, index2, chars, *args): ...\r
551     def scan_mark(self, x, y): ...\r
552     def scan_dragto(self, x, y): ...\r
553     def search(self, pattern, index, stopindex=None, forwards=None, backwards=None, exact=None, regexp=None, nocase=None, count=None, elide=None): ...\r
554     def see(self, index): ...\r
555     def tag_add(self, tagName, index1, *args): ...\r
556     def tag_unbind(self, tagName, sequence, funcid=None): ...\r
557     def tag_bind(self, tagName, sequence, func, add=None): ...\r
558     def tag_cget(self, tagName, option): ...\r
559     def tag_configure(self, tagName, cnf=None, **kw): ...\r
560     tag_config = ...  # type: Any\r
561     def tag_delete(self, *tagNames): ...\r
562     def tag_lower(self, tagName, belowThis=None): ...\r
563     def tag_names(self, index=None): ...\r
564     def tag_nextrange(self, tagName, index1, index2=None): ...\r
565     def tag_prevrange(self, tagName, index1, index2=None): ...\r
566     def tag_raise(self, tagName, aboveThis=None): ...\r
567     def tag_ranges(self, tagName): ...\r
568     def tag_remove(self, tagName, index1, index2=None): ...\r
569     def window_cget(self, index, option): ...\r
570     def window_configure(self, index, cnf=None, **kw): ...\r
571     window_config = ...  # type: Any\r
572     def window_create(self, index, cnf=..., **kw): ...\r
573     def window_names(self): ...\r
574     def yview_pickplace(self, *what): ...\r
575 \r
576 class _setit:\r
577     def __init__(self, var, value, callback=None): ...\r
578     def __call__(self, *args): ...\r
579 \r
580 class OptionMenu(Menubutton):\r
581     widgetName = ...  # type: Any\r
582     menuname = ...  # type: Any\r
583     def __init__(self, master, variable, value, *values, **kwargs): ...\r
584     def __getitem__(self, name): ...\r
585     def destroy(self): ...\r
586 \r
587 class Image:\r
588     name = ...  # type: Any\r
589     tk = ...  # type: Any\r
590     def __init__(self, imgtype, name=None, cnf=..., master=None, **kw): ...\r
591     def __del__(self): ...\r
592     def __setitem__(self, key, value): ...\r
593     def __getitem__(self, key): ...\r
594     def configure(self, **kw): ...\r
595     config = ...  # type: Any\r
596     def height(self): ...\r
597     def type(self): ...\r
598     def width(self): ...\r
599 \r
600 class PhotoImage(Image):\r
601     def __init__(self, name=None, cnf=..., master=None, **kw): ...\r
602     def blank(self): ...\r
603     def cget(self, option): ...\r
604     def __getitem__(self, key): ...\r
605     def copy(self): ...\r
606     def zoom(self, x, y: str = ...): ...\r
607     def subsample(self, x, y: str = ...): ...\r
608     def get(self, x, y): ...\r
609     def put(self, data, to=None): ...\r
610     def write(self, filename, format=None, from_coords=None): ...\r
611 \r
612 class BitmapImage(Image):\r
613     def __init__(self, name=None, cnf=..., master=None, **kw): ...\r
614 \r
615 def image_names(): ...\r
616 def image_types(): ...\r
617 \r
618 class Spinbox(Widget, XView):\r
619     def __init__(self, master=None, cnf=..., **kw): ...\r
620     def bbox(self, index): ...\r
621     def delete(self, first, last=None): ...\r
622     def get(self): ...\r
623     def icursor(self, index): ...\r
624     def identify(self, x, y): ...\r
625     def index(self, index): ...\r
626     def insert(self, index, s): ...\r
627     def invoke(self, element): ...\r
628     def scan(self, *args): ...\r
629     def scan_mark(self, x): ...\r
630     def scan_dragto(self, x): ...\r
631     def selection(self, *args): ...\r
632     def selection_adjust(self, index): ...\r
633     def selection_clear(self): ...\r
634     def selection_element(self, element=None): ...\r
635 \r
636 class LabelFrame(Widget):\r
637     def __init__(self, master=None, cnf=..., **kw): ...\r
638 \r
639 class PanedWindow(Widget):\r
640     def __init__(self, master=None, cnf=..., **kw): ...\r
641     def add(self, child, **kw): ...\r
642     def remove(self, child): ...\r
643     forget = ...  # type: Any\r
644     def identify(self, x, y): ...\r
645     def proxy(self, *args): ...\r
646     def proxy_coord(self): ...\r
647     def proxy_forget(self): ...\r
648     def proxy_place(self, x, y): ...\r
649     def sash(self, *args): ...\r
650     def sash_coord(self, index): ...\r
651     def sash_mark(self, index): ...\r
652     def sash_place(self, index, x, y): ...\r
653     def panecget(self, child, option): ...\r
654     def paneconfigure(self, tagOrId, cnf=None, **kw): ...\r
655     paneconfig = ...  # type: Any\r
656     def panes(self): ...\r