R/gframe.R

Defines functions gframe

Documented in gframe

##' @include ggroup.R

##' Class for framed box container with label
setClass("gFrame",
         contains="gGroup",
         prototype=prototype(new("gGroup"))
         )

##' Constructor for framed box container with label
##'
##' @export
gframe <- function(
                   text = "", markup = FALSE, pos = 0, horizontal=TRUE, container = NULL,
                   ... ,
                   toolkit=guiToolkit()){
  widget <- .gframe (toolkit,
                     text=text, markup=markup, pos=pos, horizontal=horizontal, container=container ,
                     ...
                     )
  obj <- new( 'gFrame',widget=widget,toolkit=toolkit) 
  return(obj)
}


##' generic for toolkit dispatch
##' @alias gframe
setGeneric( '.gframe' ,
           function(toolkit,
                    text = "", markup = FALSE, pos = 0, horizontal=TRUE,
                    container = NULL,      ... )
           standardGeneric( '.gframe' ))

Try the gWidgets package in your browser

Any scripts or data that you put into this service are public.

gWidgets documentation built on April 29, 2020, 9:37 a.m.