Module CL_DisplayWindowDescription

module CL_DisplayWindowDescription: sig .. end

API documentation for the class CL_DisplayWindowDescription

type t 
val init : ?title:string ->
?position:CL_Rect.t ->
?client_area:bool -> unit -> t
val delete : t -> unit
val copy : t -> t
val get_title : t -> string
val get_decorations : t -> bool
val get_size : t -> CL_Size.t
val get_position : t -> CL_Rect.t
val get_position_client_area : t -> bool
val is_fullscreen : t -> bool
val get_flipping_buffers : t -> int
val get_allow_resize : t -> bool
val get_bpp : t -> int
val get_refresh_rate : t -> int
val is_layered : t -> bool
val has_caption : t -> bool
val has_sysmenu : t -> bool
val has_minimize_button : t -> bool
val has_maximize_button : t -> bool
val has_border : t -> bool
val is_tool_window : t -> bool
val is_visible : t -> bool
val is_topmost : t -> bool
val get_using_gui_window_cache : t -> bool
val has_drop_shadow : t -> bool
val get_tablet_context : t -> bool
val get_depth_size : t -> int
val get_stencil_size : t -> int
val set_fullscreen : t -> unit
val show_caption : t -> unit
val show_sysmenu : t -> unit
val show_minimize_button : t -> unit
val show_maximize_button : t -> unit
val show_border : t -> unit
val set_visible : t -> unit
val set_topmost : t -> unit
val set_tool_window : t -> unit
val set_drop_shadow : t -> unit
val unset_fullscreen : t -> unit
val hide_caption : t -> unit
val hide_sysmenu : t -> unit
val hide_minimize_button : t -> unit
val hide_maximize_button : t -> unit
val hide_border : t -> unit
val set_not_visible : t -> unit
val set_not_topmost : t -> unit
val set_not_tool_window : t -> unit
val set_not_drop_shadow : t -> unit
val set_decorations : t -> bool -> unit
val set_title : t -> title:string -> unit
val set_flipping_buffers : t -> num_buffers:int -> unit
val set_allow_resize : t -> allow_resize:bool -> unit
val set_bpp : t -> bpp:int -> unit
val set_refresh_rate : t -> refresh_rate:int -> unit
val set_tablet_context : t -> create:bool -> unit
val set_using_gui_window_cache : t -> bool -> unit
val set_layered : t -> bool -> unit
val set_depth_size : t -> int -> unit
val set_stencil_size : t -> int -> unit
val set_size : t -> size:CL_Size.t -> client_area:bool -> unit
val set_position : t ->
position:CL_Rect.t -> client_area:bool -> unit