UILayoutTool.st
author Claus Gittinger <cg@exept.de>
Thu, 08 Jul 1999 11:29:00 +0200
changeset 1174 524f221e431d
parent 1077 46793bf50415
child 1198 6b7cfe55105b
permissions -rw-r--r--
initital extent a bit bigger

"
 COPYRIGHT (c) 1995 by eXept Software AG
              All Rights Reserved

 This software is furnished under a license and may be used
 only in accordance with the terms of that license and with the
 inclusion of the above copyright notice.   This software may not
 be provided or otherwise made available to, or used by, any
 other person.  No title to or ownership of the software is
 hereby transferred.
"




ApplicationModel subclass:#UILayoutTool
	instanceVariableNames:'modifiedHolder aspects selection layoutView tabList layoutSpec'
	classVariableNames:''
	poolDictionaries:''
	category:'Interface-UIPainter'
!

ApplicationModel subclass:#AlignmentOrigin
	instanceVariableNames:''
	classVariableNames:''
	poolDictionaries:''
	privateIn:UILayoutTool
!

ApplicationModel subclass:#Extent
	instanceVariableNames:''
	classVariableNames:''
	poolDictionaries:''
	privateIn:UILayoutTool
!

ApplicationModel subclass:#LayoutFrame
	instanceVariableNames:''
	classVariableNames:''
	poolDictionaries:''
	privateIn:UILayoutTool
!

ApplicationModel subclass:#LayoutOrigin
	instanceVariableNames:''
	classVariableNames:''
	poolDictionaries:''
	privateIn:UILayoutTool
!

ApplicationModel subclass:#Point
	instanceVariableNames:''
	classVariableNames:''
	poolDictionaries:''
	privateIn:UILayoutTool
!

ApplicationModel subclass:#Rectangle
	instanceVariableNames:''
	classVariableNames:''
	poolDictionaries:''
	privateIn:UILayoutTool
!

!UILayoutTool class methodsFor:'documentation'!

copyright
"
 COPYRIGHT (c) 1995 by eXept Software AG
              All Rights Reserved

 This software is furnished under a license and may be used
 only in accordance with the terms of that license and with the
 inclusion of the above copyright notice.   This software may not
 be provided or otherwise made available to, or used by, any
 other person.  No title to or ownership of the software is
 hereby transferred.
"



!

documentation
"
    used by the UIPainter to manipulate the layout of the selected component

    [author:]
        Claus Atzkern

    [see also:]
        UIPainter
        UIHelpTool
        UISpecificationTool
"


! !

!UILayoutTool class methodsFor:'constants'!

label
    ^ 'Layout'
! !

!UILayoutTool class methodsFor:'help specs'!

helpSpec
    "This resource specification was automatically generated
     by the UIHelpTool of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIHelpTool may not be able to read the specification."

    "
     UIHelpTool openOnClass:UILayoutTool    
    "

    <resource: #help>

    ^super helpSpec addPairsFrom:#(

#cornerX
'Absolute corner x of the selected widget.'

#cornerY
'Absolute corner y of the selected widget.'

#layoutTool
'Tool to set the layout of the selected widget.'

#leftAbsolute
'Offset of the left edge; positive is to the right, negative to the left.'

#leftRelative
'Relative origin x of the selected widget.'

#makeLeftAbsolute
'Computes current left offset and relative origin x to an absolute origin x.'

#makeLeftRelative
'Compute current relative origin x and offset of the left edge to a relative origin x.'

#makeTopAbsolute
'Computes current top offset and relative origin y to an absolute origin y.'

#makeTopRelative
'Computes current relative origin y and offset of the top edge to a relative origin y.'

#originX
'Absolute origin x of the selected widget.'

#originY
'Absolute origin y of the selected widget.'

#topAbsolute
'Offset of the top edge; positive is to the bottom, negative to the top.'

#topRelative
'Relative origin y of the selected widget.'

)
! !

!UILayoutTool class methodsFor:'interface specs'!

layoutOriginSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:UILayoutTool andSelector:#layoutOriginSpec
     UILayoutTool new openInterface:#layoutOriginSpec
    "

    <resource: #canvas>

    ^
     
       #(#FullSpec
          #window: 
           #(#WindowSpec
              #name: 'UILayoutTool'
              #layout: #(#LayoutFrame 216 0 173 0 560 0 354 0)
              #label: 'UILayoutTool'
              #min: #(#Point 10 10)
              #max: #(#Point 1152 900)
              #bounds: #(#Rectangle 216 173 561 355)
              #usePreferredExtent: false
          )
          #component: 
           #(#SpecCollection
              #collection: 
               #(
                 #(#FramedBoxSpec
                    #name: 'FramedBox'
                    #layout: #(#LayoutFrame 0 0.0 0 0.0 0 1.0 108 0)
                    #component: 
                     #(#SpecCollection
                        #collection: 
                         #(
                           #(#LabelSpec
                              #name: 'labelRelative'
                              #layout: #(#Point 87 6)
                              #label: 'Relative:'
                          )
                           #(#LabelSpec
                              #name: 'labelAbsolute'
                              #layout: #(#Point 187 6)
                              #label: 'Offset:'
                          )
                           #(#LabelSpec
                              #name: 'labelLeft'
                              #layout: #(#AlignmentOrigin 85 0 27 0 1 0)
                              #label: 'Left:'
                          )
                           #(#InputFieldSpec
                              #name: 'fieldLeftFraction'
                              #layout: #(#LayoutFrame 87 0 24 0 137 0 46 0)
                              #activeHelpKey: #leftRelative
                              #tabable: true
                              #model: #leftFraction
                              #group: #inputGroup
                              #type: #numberOrNil
                    #acceptChannel: #acceptChannel
                    #modifiedChannel: #modifiedChannel
                          )
                           #(#ActionButtonSpec
                              #name: 'actionRelativeLeft'
                              #layout: #(#LayoutFrame 142 0 24 0 164 0 46 0)
                              #activeHelpKey: #makeLeftRelative
                              #model: #relativeLeft
                          )
                           #(#InputFieldSpec
                              #name: 'fieldLeftOffset'
                              #layout: #(#LayoutFrame 187 0 24 0 237 0 46 0)
                              #activeHelpKey: #leftAbsolute
                              #tabable: true
                              #model: #leftOffset
                              #group: #inputGroup
                              #type: #numberOrNil
                    #acceptChannel: #acceptChannel
                    #modifiedChannel: #modifiedChannel
                          )
                           #(#ActionButtonSpec
                              #name: 'actionAbsoluteLeft'
                              #layout: #(#LayoutFrame 242 0 24 0 264 0 46 0)
                              #activeHelpKey: #makeLeftAbsolute
                              #model: #absoluteLeft
                          )
                           #(#LabelSpec
                              #name: 'labelTop'
                              #layout: #(#AlignmentOrigin 85 0 54 0 1 0)
                              #label: 'Top:'
                          )
                           #(#InputFieldSpec
                              #name: 'fieldTopFraction'
                              #layout: #(#LayoutFrame 87 0 51 0 137 0 73 0)
                              #activeHelpKey: #topRelative
                              #tabable: true
                              #model: #topFraction
                              #group: #inputGroup
                              #type: #numberOrNil
                    #acceptChannel: #acceptChannel
                    #modifiedChannel: #modifiedChannel
                          )
                           #(#ActionButtonSpec
                              #name: 'actionRelativeTop'
                              #layout: #(#LayoutFrame 142 0 51 0 164 0 73 0)
                              #activeHelpKey: #makeTopRelative
                              #model: #relativeTop
                          )
                           #(#InputFieldSpec
                              #name: 'fieldTopOffset'
                              #layout: #(#LayoutFrame 187 0 51 0 237 0 73 0)
                              #activeHelpKey: #topAbsolute
                              #tabable: true
                              #model: #topOffset
                              #group: #inputGroup
                              #type: #numberOrNil
                    #acceptChannel: #acceptChannel
                    #modifiedChannel: #modifiedChannel
                          )
                           #(#ActionButtonSpec
                              #name: 'actionAbsoluteTop'
                              #layout: #(#LayoutFrame 242 0 51 0 264 0 73 0)
                              #activeHelpKey: #makeTopAbsolute
                              #model: #absoluteTop
                          )
                        )
                    )
                    #label: 'Origin'
                    #labelPosition: #topLeft
                )
              )
          )
      )

    "Modified: / 13.8.1998 / 19:52:04 / cg"
!

layoutPointSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:UILayoutTool andSelector:#layoutPointSpec
     UILayoutTool new openInterface:#layoutPointSpec
    "

    <resource: #canvas>

    ^
     
       #(#FullSpec
          #window: 
           #(#WindowSpec
              #name: 'UILayoutTool'
              #layout: #(#LayoutFrame 216 0 173 0 493 0 296 0)
              #label: 'UILayoutTool'
              #min: #(#Point 10 10)
              #max: #(#Point 1152 900)
              #bounds: #(#Rectangle 216 173 494 297)
              #usePreferredExtent: false
          )
          #component: 
           #(#SpecCollection
              #collection: 
               #(
                 #(#FramedBoxSpec
                    #name: 'FramedBox'
                    #layout: #(#LayoutFrame 0 0.0 0 0.0 0 1.0 94 0)
                    #component: 
                     #(#SpecCollection
                        #collection: 
                         #(
                           #(#LabelSpec
                              #name: 'labelOriginY'
                              #layout: #(#AlignmentOrigin 83 0 14 0 1 0)
                              #label: 'Left:'
                          )
                           #(#InputFieldSpec
                              #name: 'fieldOriginX'
                              #layout: #(#LayoutFrame 85 0 11 0 135 0 33 0)
                              #activeHelpKey: #originX
                              #tabable: true
                              #model: #leftOffset
                              #group: #inputGroup
                              #type: #numberOrNil
                    #acceptChannel: #acceptChannel
                    #modifiedChannel: #modifiedChannel
                          )
                           #(#LabelSpec
                              #name: 'labelOriginX'
                              #layout: #(#AlignmentOrigin 83 0 39 0 1 0)
                              #label: 'Top:'
                          )
                           #(#InputFieldSpec
                              #name: 'fieldOriginY'
                              #layout: #(#LayoutFrame 85 0 36 0 135 0 58 0)
                              #activeHelpKey: #originY
                              #tabable: true
                              #model: #topOffset
                              #group: #inputGroup
                              #type: #numberOrNil
                    #acceptChannel: #acceptChannel
                    #modifiedChannel: #modifiedChannel
                          )
                        )
                    )
                    #label: 'Origin'
                    #labelPosition: #topLeft
                )
              )
          )
      )

    "Modified: / 13.8.1998 / 19:52:15 / cg"
!

slices
    ^ #(
        ( 'Frame'          LayoutFrame)
        ( 'Origin'         LayoutOrigin)
        ( 'Alig.Origin'    AlignmentOrigin)
        ( 'Point'          Point)
        ( 'Rectangle'      Rectangle)
        ( 'Extent'         Extent)
       ) 

!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:UILayoutTool andSelector:#windowSpec
     UILayoutTool new openInterface:#windowSpec
     UILayoutTool open
    "

    <resource: #canvas>

    ^
     
       #(#FullSpec
          #window: 
           #(#WindowSpec
              #name: 'UILayoutTool'
              #layout: #(#LayoutFrame 571 0 290 0 870 0 589 0)
              #label: 'UILayoutTool'
              #min: #(#Point 10 10)
              #max: #(#Point 1152 900)
              #bounds: #(#Rectangle 571 290 871 590)
              #usePreferredExtent: false
          )
          #component: 
           #(#SpecCollection
              #collection: 
               #(
                 #(#NoteBookViewSpec
                    #name: 'NoteBook'
                    #layout: #(#LayoutFrame 0 0.0 0 0.0 0 1.0 0 1.0)
                    #activeHelpKey: #layoutTool
                    #enableChannel: #enableChannel
                    #tabable: true
                    #model: #noteBookModel
                    #menu: #noteBookList
                    #style: #(#FontDescription #helvetica #medium #roman #'10')
                    #direction: #bottom
                    #canvas: #noteBookView
                )
              )
          )
      )
! !

!UILayoutTool methodsFor:'accessing'!

acceptChannel
    "return the value of the instance variable 'acceptChannel' (automatically generated)"

    ^ masterApplication acceptChannel
!

layout
    "returns configued layout or nil
    "
    |appl|

    (appl := self noteBookView application) notNil ifTrue:[
        ^ appl layout
    ].
  ^ nil
!

layoutType
    "returns current layout type or nil
    "
    |slice|

    (slice := self selectedSlice) notNil ifTrue:[
        ^ slice last
    ].
  ^ nil
!

layoutView
    "returns current edited view
    "
    ^ layoutView
!

layoutView:aView type:aTypeOrNil spec:aSpec
    "change current edited view
    "
    |type name list|

    layoutView := aView.
    layoutSpec := aSpec.

    (self aspectFor:#defaultExtentEnabled) value:(aSpec class ==  WindowSpec) not.

    aTypeOrNil notNil ifTrue:[
        self class slices findFirst:[:e|
            e last == aTypeOrNil ifTrue:[name := e first. true]
        ].
        list := Array with:name
    ] ifFalse:[
        (type := UIPainterView layoutType:layoutView) notNil ifTrue:[
            self class slices findFirst:[:e|
                e last == type ifTrue:[name := e first. true]
            ].
            list := tabList.

            type == #Extent ifTrue:[
                aView superView specClass isLayoutContainer ifTrue:[
                    list := Array with:name
                ] ifFalse:[
                    list := list copyWith:name
                ]
            ]
        ]
    ].
    self noteBookList  value:list.
    self noteBookModel value:name.
    self update.
!

modifiedHolder:aValueHolder
    "set the value holder set to true in case of modifying attributes
    "
    modifiedHolder notNil ifTrue:[
        modifiedHolder removeDependent:self. 
    ].

    (modifiedHolder := aValueHolder) notNil ifTrue:[
        modifiedHolder addDependent:self.
    ].

!

update
    "update from view
    "
    |view appl|

    selection notNil ifTrue:[
        (view := layoutView) notNil ifTrue:[
            (appl := self noteBookView application) notNil ifTrue:[
                appl fetch:view spec:layoutSpec
            ]
        ]
    ].
        
! !

!UILayoutTool methodsFor:'aspects'!

aspectFor:aKey
    "returns aspect for a key or nil
    "
  ^ aspects at:aKey ifAbsent:[ super aspectFor:aKey ]


!

notUsingDefaultExtent
    |holder|

    (holder := builder bindingAt:#notUsingDefaultExtent) isNil ifTrue:[
        holder := BlockValue forLogicalNot:(self aspectFor:#useDefaultExtent).
        builder aspectAt:#notUsingDefaultExtent put:holder.
    ].
    ^ holder

!

noteBookList
    "returns list of tab labels
    "
    |holder|

    (holder := builder bindingAt:#noteBookList) isNil ifTrue:[
        holder := nil asValue.
        builder aspectAt:#noteBookList put:holder
    ].
  ^ holder
!

noteBookModel
    "automatically generated by UIPainter ..."

    |holder|

    (holder := builder bindingAt:#noteBookModel) isNil ifTrue:[
        holder := AspectAdaptor new subject:self; forAspect:#selection.
        builder aspectAt:#noteBookModel put:holder.
    ].
    ^ holder
!

noteBookView
    "automatically generated by UIPainter ...
    "
    |holder|

    (holder := builder bindingAt:#noteBookView) isNil ifTrue:[
        holder := SubCanvas new.
        builder aspectAt:#noteBookView put:holder
    ].
  ^ holder
! !

!UILayoutTool methodsFor:'change & update'!

update:something with:aParameter from:changedObject
    "one of my models changed its value
    "
    changedObject ~~ modifiedHolder ifTrue:[
        modifiedHolder value ~~ true ifTrue:[
            modifiedHolder isNil ifFalse:[
                modifiedHolder value:true
            ]
        ]
    ]

! !

!UILayoutTool methodsFor:'converting absolute'!

absolute:what xOrY:xOrY
    |extent fraction offset fractSymb offsetSymb|

    extent     := (self layoutView superView computeExtent) perform:xOrY.
    fractSymb  := (what, 'Fraction') asSymbol.
    offsetSymb := (what,   'Offset') asSymbol.
    fraction   := (self aspectFor:fractSymb)  value.
    offset     := (self aspectFor:offsetSymb) value.
    offset     := offset + ((fraction * extent) asInteger).

    (self aspectFor:offsetSymb) value:offset.
    (self aspectFor:fractSymb)  value:0.



!

absoluteBottom
    self absolute:'bottom' xOrY:#y

!

absoluteLeft
    self absolute:'left' xOrY:#x

!

absoluteRight
    self absolute:'right' xOrY:#x

!

absoluteTop
    self absolute:'top' xOrY:#y

! !

!UILayoutTool methodsFor:'converting relative'!

relative:what xOrY:xOrY
    |extent fraction offset fractSymb offsetSymb|

    extent     := (self layoutView superView computeExtent) perform:xOrY.
    fractSymb  := (what, 'Fraction') asSymbol.
    offsetSymb := (what,   'Offset') asSymbol.
    fraction   := (self aspectFor:fractSymb)  value.
    offset     := (self aspectFor:offsetSymb) value.
    fraction   := (fraction + (offset / extent)) asFloat.

    (fraction > 1.0) ifTrue:[ fraction := 1.0 ].
    (fraction < 0.0) ifTrue:[ fraction := 0 ].

    (self aspectFor:offsetSymb) value:0.
    (self aspectFor:fractSymb)  value:fraction.



!

relativeBottom
    self relative:'bottom' xOrY:#y


!

relativeLeft
    self relative:'left' xOrY:#x

!

relativeRight
    self relative:'right' xOrY:#x

!

relativeTop
    self relative:'top' xOrY:#y

! !

!UILayoutTool methodsFor:'initialization'!

initialize
    "initialize channels
    "
    |slices size|

    super initialize.

    aspects  := IdentityDictionary new.

    #(  bottomFraction          bottomOffset
        leftFraction            leftOffset
        topFraction             topOffset
        rightFraction           rightOffset
        leftAlignmentFraction   topAlignmentFraction
        useDefaultExtent
        defaultExtentEnabled
    )

    do:[:aKey||holder|
        holder := ValueHolder new.
        holder addDependent:self.
        aspects at:aKey put:holder.
    ].

    slices  := self class slices.
    size    := slices size - 1.
    tabList := Array new:size.

    1 to:size do:[:i| tabList at:i put:((slices at:i) first) ].


! !

!UILayoutTool methodsFor:'selection'!

selectedSlice
    "returns slice assigned to selection or nil
    "
    selection notNil ifTrue:[
        self class slices do:[:aSlice|
            aSlice first = selection ifTrue:[
                ^ aSlice
            ]
        ]
    ].
    ^ nil

!

selection
    ^ selection
!

selection:aSelection
    |appl slice sel noteBook|

    aSelection isNumber ifTrue:[
        aSelection ~~ 0 ifTrue:[sel := tabList at:aSelection]
    ] ifFalse:[
        sel := aSelection
    ].
    selection = sel ifFalse:[
        (selection := sel) notNil ifTrue:[
            slice := self selectedSlice.
            appl  := slice last asString.
            appl := Smalltalk classNamed:(self class name asString, '::', appl).
            appl := appl new.
            appl masterApplication:self.
            modifiedHolder value:true.
        ].
        noteBook := self noteBookView.
        noteBook client:appl.

        appl notNil ifTrue:[
            noteBook scrolledView allViewBackground:(noteBook viewBackground).
        ]
    ].
    self update

! !

!UILayoutTool::AlignmentOrigin class methodsFor:'help specs'!

helpSpec
    "This resource specification was automatically generated
     by the UIHelpTool of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIHelpTool may not be able to read the specification."

    "
     UIHelpTool openOnClass:UILayoutTool::AlignmentOrigin    
    "

    <resource: #help>

    ^super helpSpec addPairsFrom:#(

#alignBottomCenter
'Aligns the selected widget bottomCenter to location.'

#alignBottomLeft
'Aligns the selected widget bottomLeft to location.'

#alignBottomRight
'Aligns the selected widget bottomRight to location.'

#alignCenter
'Aligns the selected widget center to location.'

#alignHorizontal
'Horizontal inset to the location point of the selected widget.'

#alignLeftCenter
'Aligns the selected widget leftCenter to location.'

#alignRightCenter
'Aligns the selected widget rightCenter to location.'

#alignTopCenter
'Aligns the selected widget topCenter to location.'

#alignTopLeft
'Aligns the selected widget topLeft to location.'

#alignTopRight
'Aligns the selected widget topRight to location.'

#alignVertical
'Vertical inset to the location point of the widget.'

)
! !

!UILayoutTool::AlignmentOrigin class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:UILayoutTool::AlignmentOrigin andSelector:#windowSpec
     UILayoutTool::AlignmentOrigin new openInterface:#windowSpec
     UILayoutTool::AlignmentOrigin open
    "

    <resource: #canvas>

    ^
     
       #(#FullSpec
          #window: 
           #(#WindowSpec
              #name: 'UILayoutTool-AlignmentOrigin'
              #layout: #(#LayoutFrame 291 0 130 0 695 0 336 0)
              #label: 'UILayoutTool-AlignmentOrigin'
              #min: #(#Point 10 10)
              #max: #(#Point 1152 900)
              #bounds: #(#Rectangle 291 130 696 337)
              #usePreferredExtent: false
          )
          #component: 
           #(#SpecCollection
              #collection: 
               #(
                 #(#UISubSpecification
                    #name: 'layoutOriginSpec'
                    #layout: #(#LayoutFrame 1 0.0 6 0 0 1.0 111 0)
                    #majorKey: #UILayoutTool
                    #minorKey: #layoutOriginSpec
                )
                 #(#FramedBoxSpec
                    #name: 'FramedBox'
                    #layout: #(#LayoutFrame 1 0.0 113 0 0 1.0 208 0)
                    #component: 
                     #(#SpecCollection
                        #collection: 
                         #(
                           #(#LabelSpec
                              #name: 'alignHLabel'
                              #layout: #(#AlignmentOrigin 88 0 17 0 1 0)
                              #label: 'Horizontal:'
                              #adjust: #right
                          )
                           #(#LabelSpec
                              #name: 'alignVLabel'
                              #layout: #(#AlignmentOrigin 88 0 43 0 1 0)
                              #label: 'Vertical:'
                              #adjust: #right
                          )
                           #(#InputFieldSpec
                              #name: 'leftAlignmentFractionField'
                              #layout: #(#LayoutFrame 90 0 14 0 147 0 36 0)
                              #activeHelpKey: #alignHorizontal
                              #tabable: true
                              #model: #leftAlignmentFraction
                              #group: #inputGroup
                              #type: #numberOrNil
                              #acceptOnLostFocus: true
                    #acceptChannel: #acceptChannel
                    #modifiedChannel: #modifiedChannel
                          )
                           #(#InputFieldSpec
                              #name: 'topAlignmentFractionField'
                              #layout: #(#LayoutFrame 90 0 40 0 147 0 62 0)
                              #activeHelpKey: #alignVertical
                              #tabable: true
                              #model: #topAlignmentFraction
                              #group: #inputGroup
                              #type: #numberOrNil
                              #acceptOnLostFocus: true
                    #acceptChannel: #acceptChannel
                    #modifiedChannel: #modifiedChannel
                          )
                           #(#DividerSpec
                              #name: 'separator1'
                              #layout: #(#LayoutFrame 204 0 19 0 245 0 22 0)
                          )
                           #(#DividerSpec
                              #name: 'separator2'
                              #layout: #(#LayoutFrame 204 0 55 0 245 0 58 0)
                          )
                           #(#DividerSpec
                              #name: 'separator3'
                              #layout: #(#LayoutFrame 196 0 28 0 199 0 50 0)
                              #orientation: #vertical
                          )
                           #(#DividerSpec
                              #name: 'separator4'
                              #layout: #(#LayoutFrame 250 0 28 0 253 0 50 0)
                              #orientation: #vertical
                          )
                           #(#ActionButtonSpec
                              #name: 'alignBottomRight'
                              #layout: #(#LayoutFrame 245 0 50 0 259 0 64 0)
                              #activeHelpKey: #alignBottomRight
                              #model: #alignBottomRight
                          )
                           #(#ActionButtonSpec
                              #name: 'alignTopLeft'
                              #layout: #(#LayoutFrame 190 0 14 0 204 0 28 0)
                              #activeHelpKey: #alignTopLeft
                              #model: #alignTopLeft
                          )
                           #(#ActionButtonSpec
                              #name: 'alignTopRight'
                              #layout: #(#LayoutFrame 245 0 14 0 259 0 28 0)
                              #activeHelpKey: #alignTopRight
                              #model: #alignTopRight
                          )
                           #(#ActionButtonSpec
                              #name: 'alignBottomLeft'
                              #layout: #(#LayoutFrame 190 0 50 0 204 0 64 0)
                              #activeHelpKey: #alignBottomLeft
                              #model: #alignBottomLeft
                          )
                           #(#ActionButtonSpec
                              #name: 'alignTopCenter'
                              #layout: #(#LayoutFrame 217 0 14 0 231 0 28 0)
                              #activeHelpKey: #alignTopCenter
                              #model: #alignTopCenter
                          )
                           #(#ActionButtonSpec
                              #name: 'alignBottomCenter'
                              #layout: #(#LayoutFrame 217 0 50 0 231 0 64 0)
                              #activeHelpKey: #alignBottomCenter
                              #model: #alignBottomCenter
                          )
                           #(#ActionButtonSpec
                              #name: 'alignLeftCenter'
                              #layout: #(#LayoutFrame 190 0 32 0 204 0 46 0)
                              #activeHelpKey: #alignLeftCenter
                              #model: #alignLeftCenter
                          )
                           #(#ActionButtonSpec
                              #name: 'alignRightCenter'
                              #layout: #(#LayoutFrame 245 0 32 0 259 0 46 0)
                              #activeHelpKey: #alignRightCenter
                              #model: #alignRightCenter
                          )
                           #(#ActionButtonSpec
                              #name: 'alignCenter'
                              #layout: #(#LayoutFrame 217 0 32 0 231 0 46 0)
                              #activeHelpKey: #alignCenter
                              #model: #alignCenter
                          )
                        )
                    )
                    #label: 'Alignment'
                    #labelPosition: #topLeft
                )
              )
          )
      )

    "Modified: / 13.8.1998 / 19:57:47 / cg"
! !

!UILayoutTool::AlignmentOrigin methodsFor:'accessing'!

fetch:aView spec:aSpec
    "fetch alignmentOrigin
    "
    |layout type|

    type   := UIPainterView layoutType:aView.
    layout := aView geometryLayout.

    layout isLayout ifTrue:[
        (self aspectFor:#leftOffset)   value:(layout leftOffset).
        (self aspectFor:#leftFraction) value:(layout leftFraction).
        (self aspectFor:#topOffset)    value:(layout topOffset).
        (self aspectFor:#topFraction)  value:(layout topFraction).

        type == #AlignmentOrigin ifTrue:[
            (self aspectFor:#leftAlignmentFraction) value:(layout leftAlignmentFraction).
            (self aspectFor:#topAlignmentFraction)  value:(layout topAlignmentFraction).
          ^ self
        ]
    ] ifFalse:[
        layout := aView computeOrigin.

        (self aspectFor:#leftOffset)   value:(layout x).
        (self aspectFor:#leftFraction) value:0.
        (self aspectFor:#topOffset)    value:(layout y).
        (self aspectFor:#topFraction)  value:0.
    ].
    (self aspectFor:#leftAlignmentFraction) value:0.
    (self aspectFor:#topAlignmentFraction)  value:0.


!

layout
    "returns current layout as alignmentOrigin
    "
    |layout|

    layout  := Smalltalk::AlignmentOrigin new.

    layout   leftOffset:((self aspectFor:#leftOffset)   value) ? 0.
    layout    topOffset:((self aspectFor:#topOffset)    value) ? 0.
    layout leftFraction:((self aspectFor:#leftFraction) value) ? 0.
    layout  topFraction:((self aspectFor:#topFraction)  value) ? 0.

    layout leftAlignmentFraction:((self aspectFor:#leftAlignmentFraction) value) ? 0.
    layout  topAlignmentFraction:((self aspectFor:#topAlignmentFraction)  value) ? 0.

  ^ layout
! !

!UILayoutTool::AlignmentOrigin methodsFor:'alignment'!

alignBottomCenter
    self makeAlignLeft:0.5 top:1


!

alignBottomLeft
    self makeAlignLeft:0 top:1


!

alignBottomRight
    self makeAlignLeft:1 top:1


!

alignCenter
    self makeAlignLeft:0.5 top:0.5


!

alignLeftCenter
    self makeAlignLeft:0 top:0.5


!

alignRightCenter
    self makeAlignLeft:1 top:0.5


!

alignTopCenter
    self makeAlignLeft:0.5 top:0


!

alignTopLeft
    self makeAlignLeft:0 top:0


!

alignTopRight
    self makeAlignLeft:1 top:0


!

makeAlignLeft:leftAlignmentFraction top:topAlignmentFraction
    |lAF tAF lO tO ext|

    lAF     := (self aspectFor:#leftAlignmentFraction) value ? 0.
    tAF     := (self aspectFor:#topAlignmentFraction)  value ? 0.
    ext     := (self aspectFor:#layoutView) computeExtent.

    (self aspectFor:#leftAlignmentFraction) value:leftAlignmentFraction.
    (self aspectFor:#topAlignmentFraction)  value:topAlignmentFraction.

    lO := (self aspectFor:#leftOffset) value ? 0.
    tO := (self aspectFor:#topOffset)  value ? 0.

    lO := lO + (ext x * (leftAlignmentFraction - lAF)).
    tO := tO + (ext y * (topAlignmentFraction  - tAF)).

    (self aspectFor:#leftOffset) value:(lO rounded).
    (self aspectFor:#topOffset)  value:(tO rounded).

!

makeAlignTopRight
    self makeAlignLeft:1 top:0


! !

!UILayoutTool::Extent class methodsFor:'help specs'!

helpSpec
    "This resource specification was automatically generated
     by the UIHelpTool of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIHelpTool may not be able to read the specification."

    "
     UIHelpTool openOnClass:UILayoutTool::Extent    
    "

    <resource: #help>

    ^super helpSpec addPairsFrom:#(

#hrzExtent
'Horizontal extent of the selected widget.'

#vrtExtent
'Vertical extent of the selected widget.'

)
! !

!UILayoutTool::Extent class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:UILayoutTool::Extent andSelector:#windowSpec
     UILayoutTool::Extent new openInterface:#windowSpec
     UILayoutTool::Extent open
    "

    <resource: #canvas>

    ^
     
       #(#FullSpec
          #name: #windowSpec
          #window: 
           #(#WindowSpec
              #name: 'UILayoutTool-Extent'
              #layout: #(#LayoutFrame 216 0 173 0 541 0 321 0)
              #level: 0
              #label: 'UILayoutTool-Extent'
              #min: #(#Point 10 10)
              #max: #(#Point 1152 900)
              #bounds: #(#Rectangle 216 173 542 322)
              #usePreferredExtent: false
              #returnIsOKInDialog: true
              #escapeIsCancelInDialog: true
          )
          #component: 
           #(#SpecCollection
              #collection: 
               #(
                 #(#FramedBoxSpec
                    #name: 'FramedBox'
                    #layout: #(#LayoutFrame 0 0.0 6 0.0 0 1.0 137 0)
                    #component: 
                     #(#SpecCollection
                        #collection: 
                         #(
                           #(#LabelSpec
                              #name: 'labelWidth'
                              #layout: #(#AlignmentOrigin 89 0 24 0 1 0.5)
                              #label: 'Width:'
                              #adjust: #right
                          )
                           #(#InputFieldSpec
                              #name: 'fieldLeftOffset'
                              #layout: #(#LayoutFrame 90 0 13 0 140 0 35 0)
                              #activeHelpKey: #hrzExtent
                              #enableChannel: #notUsingDefaultExtent
                              #tabable: true
                              #model: #leftOffset
                              #group: #inputGroup
                              #type: #numberOrNil
                              #acceptOnLostFocus: true
                              #acceptChannel: #acceptChannel
                              #modifiedChannel: #modifiedChannel
                          )
                           #(#LabelSpec
                              #name: 'labelHeight'
                              #layout: #(#AlignmentOrigin 89 0 49 0 1 0.5)
                              #label: 'Height:'
                              #adjust: #right
                          )
                           #(#InputFieldSpec
                              #name: 'fieldRightOffset'
                              #layout: #(#LayoutFrame 90 0 38 0 140 0 60 0)
                              #activeHelpKey: #vrtExtent
                              #enableChannel: #notUsingDefaultExtent
                              #tabable: true
                              #model: #rightOffset
                              #group: #inputGroup
                              #type: #numberOrNil
                              #acceptOnLostFocus: true
                              #acceptChannel: #acceptChannel
                              #modifiedChannel: #modifiedChannel
                          )
                           #(#CheckBoxSpec
                              #name: 'useDefaultExtentCheckBox'
                              #layout: #(#LayoutFrame -1 0 75 0 296 0 97 0)
                              #model: #useDefaultExtent
                              #label: 'Use Widgets Default Extent'
                              #translateLabel: true
                              #enableChannel: #defaultExtentEnabled
                          )
                        )
                    )
                    #label: 'Extent'
                    #labelPosition: #topLeft
                )
              )
          )
      )
! !

!UILayoutTool::Extent methodsFor:'accessing'!

fetch:aView spec:aSpec
    "fetch extent
    "
    |extent|

    extent  := aView computeExtent.

    (self aspectFor:#leftOffset)  value:(extent x).
    (self aspectFor:#rightOffset) value:(extent y).

    (self aspectFor:#useDefaultExtent) value:aSpec useDefaultExtent 
!

layout
    "returns current extent
    "
  ^ Smalltalk::Point x:(((self aspectFor:#leftOffset)   value) ? 0)
                     y:(((self aspectFor:#rightOffset)  value) ? 0)

! !

!UILayoutTool::LayoutFrame class methodsFor:'help specs'!

helpSpec
    "This resource specification was automatically generated
     by the UIHelpTool of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIHelpTool may not be able to read the specification."

    "
     UIHelpTool openOnClass:UILayoutTool::LayoutFrame    
    "

    <resource: #help>

    ^super helpSpec addPairsFrom:#(

#bottomAbsolute
'Offset of the bottom edge; positive is to the bottom, negative to the top.'

#bottomFixPartLayout
'Set the layout for a fixed area at the bottom of the widgets containers space'

#bottomHalfLayout
'Set the layout for the bottom half of the widgets containers space'

#bottomRelative
'Relative corner y of the selected widget.'

#leftHalfLayout
'Set the layout for the left half of the widgets containers space'

#makeBottomAbsolute
'Computes current bottom offset and relative corner y to an absolute corner y.'

#makeBottomRelative
'Computes current relative corner y and offset of the bottom edge to a relative corner y.'

#makeRightAbsolute
'Computes current right offset and relative corner x to an absolute corner x.'

#makeRightRelative
'Computes current relative corner x and offset of the right edge to a relative corner x.'

#rightAbsolute
'Offset of the right edge; positive is to the right, negative to the left.'

#rightHalfLayout
'Set the layout for the right half of the widgets containers space'

#rightRelative
'Relative corner x of the selected widget.'

#topFixPartLayout
'Set the layout for a fixed area at the top of the widgets containers space'

#topHalfLayout
'Set the layout for the top half of the widgets containers space'

#topLeftQuarterLayout
'Set the layout for the top-left quarter of the widgets containers space'

#topRightQuarterLayout
'Set the layout for the top-right quarter of the widgets containers space'

#bottomRightQuarterLayout
'Set the layout for the bottom-right quarter of the widgets containers space'

#bottomLeftQuarterLayout
'Set the layout for the bottom-left quarter of the widgets containers space'

)
! !

!UILayoutTool::LayoutFrame class methodsFor:'image specs'!

setBottomFixPartIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self setBottomFixPartIcon inspect
     ImageEditor openOnClass:self andSelector:#setBottomFixPartIcon
    "

    <resource: #image>

    ^Icon
        constantNamed:#'UILayoutTool::LayoutFrame setBottomFixPartIcon'
        ifAbsentPut:[(Depth4Image new) width: 16; height: 16; photometric:(#palette); bitsPerSample:(#(4 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@H"H"@BH"H @!!DQD@DQDR@BDQDP@QDQH@H"H"@BH"H @@@@@@@@@@@b') ; colorMapFromArray:#[0 0 0 255 0 0 255 255 255]; mask:((Depth1Image new) width: 16; height: 16; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'??>@@X@A @F@@X@A @F@@X@A @G???????????????<b') ; yourself); yourself]!

setBottomHalfIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self setBottomHalfIcon inspect
     ImageEditor openOnClass:self andSelector:#setBottomHalfIcon
    "

    <resource: #image>

    ^Icon
        constantNamed:#'UILayoutTool::LayoutFrame setBottomHalfIcon'
        ifAbsentPut:[(Depth4Image new) width: 16; height: 16; photometric:(#palette); bitsPerSample:(#(4 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@"H"H"H"H"@BDQDQDQDQH@HQDQDQDQD @!!DQDQDQDR@BDQDQDQDQH@H"H"H"H"H @@@@@@@@@@@b') ; colorMapFromArray:#[0 0 0 255 0 0 255 255 255]; mask:((Depth1Image new) width: 16; height: 16; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'??>@@X@A @F@@X@A @F@@_????????????????????<b') ; yourself); yourself]!

setBottomLeftQuarterIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self setBottomLeftQuarterIcon inspect
     ImageEditor openOnClass:self andSelector:#setBottomLeftQuarterIcon
    "

    <resource: #image>

    ^Icon
        constantNamed:#'UILayoutTool::LayoutFrame setBottomLeftQuarterIcon'
        ifAbsentPut:[(Depth4Image new) width: 16; height: 16; photometric:(#palette); bitsPerSample:(#(4 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@H"H"@@@@@@@!!DQH@@@@@@BDQD @@@@@@HQDR@@@@@@@!!DQH@@@@@@BDQD @@@@@@H"H"@@@@@@@@@@@@@@@@@b') ; colorMapFromArray:#[0 0 0 255 0 0 255 255 255]; mask:((Depth1Image new) width: 16; height: 16; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'??>@@X@A @F@@X@A @G?@_<A?0G?@_<A?0G?@_<A??<b') ; yourself); yourself]!

setBottomRightQuarterIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self setBottomRightQuarterIcon inspect
     ImageEditor openOnClass:self andSelector:#setBottomRightQuarterIcon
    "

    <resource: #image>

    ^Icon
        constantNamed:#'UILayoutTool::LayoutFrame setBottomRightQuarterIcon'
        ifAbsentPut:[(Depth4Image new) width: 16; height: 16; photometric:(#palette); bitsPerSample:(#(4 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@BH"H"@@@@@@HQDQH@@@@@@!!DQD @@@@@BDQDR@@@@@@HQDQH@@@@@@"H"H @@@@@@@@@@@b') ; colorMapFromArray:#[0 0 0 255 0 0 255 255 255]; mask:((Depth1Image new) width: 16; height: 16; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'??>@@X@A @F@@X@A @F@@XG? _>A?8G? _>A?8G???<b') ; yourself); yourself]!

setLeftHalfIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self setLeftHalfIcon inspect
     ImageEditor openOnClass:self andSelector:#setLeftHalfIcon
    "

    <resource: #image>

    ^Icon
        constantNamed:#'UILayoutTool::LayoutFrame setLeftHalfIcon'
        ifAbsentPut:[(Depth4Image new) width: 16; height: 16; photometric:(#palette); bitsPerSample:(#(4 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@BH"H @@@@@@HQDR@@@@@@@!!DQH@@@@@@BDQD @@@@@@HQDR@@@@@@@!!DQH@@@@@@BDQD @@@@@@HQDR@@@@@@@!!DQH@@@@@@BDQD @@@@@@HQDR@@@@@@@!!DQH@@@@@@BDQD @@@@@@H"H"@@@@@@@@@@@@@@@@@b') ; colorMapFromArray:#[0 0 0 255 0 0 255 255 255]; mask:((Depth1Image new) width: 16; height: 16; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'????@_<A?0G?@_<A?0G?@_<A?0G?@_<A?0G?@_<A??<b') ; yourself); yourself]!

setRightHalfIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self setRightHalfIcon inspect
     ImageEditor openOnClass:self andSelector:#setRightHalfIcon
    "

    <resource: #image>

    ^Icon
        constantNamed:#'UILayoutTool::LayoutFrame setRightHalfIcon'
        ifAbsentPut:[(Depth4Image new) width: 16; height: 16; photometric:(#palette); bitsPerSample:(#(4 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@@@@@@@"H"H@@@@@@BDQD @@@@@@HQDR@@@@@@@!!DQH@@@@@@BDQD @@@@@@HQDR@@@@@@@!!DQH@@@@@@BDQD @@@@@@HQDR@@@@@@@!!DQH@@@@@@BDQD @@@@@@HQDR@@@@@@@!!DQH@@@@@@BH"H @@@@@@@@@@@b') ; colorMapFromArray:#[0 0 0 255 0 0 255 255 255]; mask:((Depth1Image new) width: 16; height: 16; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'??>@?8C? O>@?8C? O>@?8C? O>@?8C? O>@?8C???<b') ; yourself); yourself]!

setToRightQuarterIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self setToRightQuarterIcon inspect
     ImageEditor openOnClass:self andSelector:#setToRightQuarterIcon
    "

    <resource: #image>

    ^Icon
        constantNamed:#'UILayoutTool::LayoutFrame setToRightQuarterIcon'
        ifAbsentPut:[(Depth4Image new) width: 16; height: 16; photometric:(#palette); bitsPerSample:(#(4 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@@@@@@@"H"H@@@@@@BDQD @@@@@@HQDR@@@@@@@!!DQH@@@@@@BDQD @@@@@@HQDR@@@@@@@"H"H@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@b') ; colorMapFromArray:#[0 0 0 255 0 0 255 255 255]; mask:((Depth1Image new) width: 16; height: 16; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'??>@?8C? O>@?8C? O>@?8C? @F@@X@A @F@@X@A??<b') ; yourself); yourself]!

setTopFixPartIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self setTopFixPartIcon inspect
     ImageEditor openOnClass:self andSelector:#setTopFixPartIcon
    "

    <resource: #image>

    ^Icon
        constantNamed:#'UILayoutTool::LayoutFrame setTopFixPartIcon'
        ifAbsentPut:[(Depth4Image new) width: 16; height: 16; photometric:(#palette); bitsPerSample:(#(4 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@BH"H @"H"H@HQDQ@ADQD @!!DQD@DQDR@BH"H @"H"H@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@b') ; colorMapFromArray:#[0 0 0 255 0 0 255 255 255]; mask:((Depth1Image new) width: 16; height: 16; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'???????????????? @F@@X@A @F@@X@A @F@@X@A??<b') ; yourself); yourself]!

setTopHalfIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self setTopHalfIcon inspect
     ImageEditor openOnClass:self andSelector:#setTopHalfIcon
    "

    <resource: #image>

    ^Icon
        constantNamed:#'UILayoutTool::LayoutFrame setTopHalfIcon'
        ifAbsentPut:[(Depth4Image new) width: 16; height: 16; photometric:(#palette); bitsPerSample:(#(4 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@BH"H"H"H"H@HQDQDQDQD @!!DQDQDQDR@BDQDQDQDQH@HQDQDQDQD @"H"H"H"H"@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@b') ; colorMapFromArray:#[0 0 0 255 0 0 255 255 255]; mask:((Depth1Image new) width: 16; height: 16; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'?????????????????????8@A @F@@X@A @F@@X@A??<b') ; yourself); yourself]!

setTopLeftQuarterIcon
    "This resource specification was automatically generated
     by the ImageEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the ImageEditor may not be able to read the specification."

    "
     self setTopLeftQuarterIcon inspect
     ImageEditor openOnClass:self andSelector:#setTopLeftQuarterIcon
    "

    <resource: #image>

    ^Icon
        constantNamed:#'UILayoutTool::LayoutFrame setTopLeftQuarterIcon'
        ifAbsentPut:[(Depth4Image new) width: 16; height: 16; photometric:(#palette); bitsPerSample:(#(4 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'@@@@@@@@@@@BH"H"@@@@@@HQDQH@@@@@@!!DQD @@@@@BDQDR@@@@@@HQDQH@@@@@@"H"H @@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@b') ; colorMapFromArray:#[0 0 0 255 0 0 255 255 255]; mask:((Depth1Image new) width: 16; height: 16; photometric:(#blackIs0); bitsPerSample:(#(1 )); samplesPerPixel:(1); bits:(ByteArray fromPackedString:'???? _>A?8G? _>A?8G? X@A @F@@X@A @F@@X@A??<b') ; yourself); yourself]! !

!UILayoutTool::LayoutFrame class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:UILayoutTool::LayoutFrame andSelector:#windowSpec
     UILayoutTool::LayoutFrame new openInterface:#windowSpec
     UILayoutTool::LayoutFrame open
    "

    <resource: #canvas>

    ^
     
       #(#FullSpec
          #name: #windowSpec
          #window: 
           #(#WindowSpec
              #name: 'UILayoutTool-LayoutFrame'
              #layout: #(#LayoutFrame 216 0 173 0 614 0 475 0)
              #level: 0
              #label: 'UILayoutTool-LayoutFrame'
              #min: #(#Point 10 10)
              #max: #(#Point 1152 900)
              #bounds: #(#Rectangle 216 173 615 476)
              #usePreferredExtent: false
              #forceRecursiveBackground: false
              #returnIsOKInDialog: true
              #escapeIsCancelInDialog: true
          )
          #component: 
           #(#SpecCollection
              #collection: 
               #(
                 #(#UISubSpecification
                    #name: 'layoutOriginSpec'
                    #layout: #(#LayoutFrame 1 0.0 6 0 0 1.0 110 0)
                    #majorKey: #UILayoutTool
                    #minorKey: #layoutOriginSpec
                )
                 #(#FramedBoxSpec
                    #name: 'FramedBox'
                    #layout: #(#LayoutFrame 1 0.0 113 0 0 1.0 214 0)
                    #component: 
                     #(#SpecCollection
                        #collection: 
                         #(
                           #(#LabelSpec
                              #name: 'labelRight'
                              #layout: #(#AlignmentOrigin 88 0 25 0 1 0.5)
                              #label: 'Right:'
                          )
                           #(#InputFieldSpec
                              #name: 'fieldRightFraction'
                              #layout: #(#LayoutFrame 90 0 14 0 140 0 36 0)
                              #activeHelpKey: #rightRelative
                              #model: #rightFraction
                              #group: #inputGroup
                              #type: #numberOrNil
                              #acceptOnLostFocus: true
                              #acceptChannel: #acceptChannel
                              #modifiedChannel: #modifiedChannel
                          )
                           #(#ActionButtonSpec
                              #name: 'actionRelativeRight'
                              #layout: #(#LayoutFrame 145 0 14 0 167 0 36 0)
                              #activeHelpKey: #makeRightRelative
                              #model: #relativeRight
                          )
                           #(#InputFieldSpec
                              #name: 'fieldRightOffset'
                              #layout: #(#LayoutFrame 190 0 14 0 240 0 36 0)
                              #activeHelpKey: #rightAbsolute
                              #model: #rightOffset
                              #group: #inputGroup
                              #type: #numberOrNil
                              #acceptOnLostFocus: true
                              #acceptChannel: #acceptChannel
                              #modifiedChannel: #modifiedChannel
                          )
                           #(#ActionButtonSpec
                              #name: 'actionAbsoluteRight'
                              #layout: #(#LayoutFrame 245 0 14 0 267 0 36 0)
                              #activeHelpKey: #makeRightAbsolute
                              #model: #absoluteRight
                          )
                           #(#LabelSpec
                              #name: 'labelBottom'
                              #layout: #(#AlignmentOrigin 88 0 53 0 1 0.5)
                              #label: 'Bottom:'
                          )
                           #(#InputFieldSpec
                              #name: 'fieldBottomFraction'
                              #layout: #(#LayoutFrame 90 0 42 0 140 0 64 0)
                              #activeHelpKey: #bottomRelative
                              #model: #bottomFraction
                              #group: #inputGroup
                              #type: #numberOrNil
                              #acceptOnLostFocus: true
                              #acceptChannel: #acceptChannel
                              #modifiedChannel: #modifiedChannel
                          )
                           #(#ActionButtonSpec
                              #name: 'actionRelativeBottom'
                              #layout: #(#LayoutFrame 145 0 42 0 167 0 64 0)
                              #activeHelpKey: #makeBottomRelative
                              #model: #relativeBottom
                          )
                           #(#InputFieldSpec
                              #name: 'fieldBottomOffset'
                              #layout: #(#LayoutFrame 190 0 42 0 240 0 64 0)
                              #activeHelpKey: #bottomAbsolute
                              #model: #bottomOffset
                              #group: #inputGroup
                              #type: #numberOrNil
                              #acceptOnLostFocus: true
                              #acceptChannel: #acceptChannel
                              #modifiedChannel: #modifiedChannel
                          )
                           #(#ActionButtonSpec
                              #name: 'actionAbsoluteBottom'
                              #layout: #(#LayoutFrame 245 0 42 0 267 0 64 0)
                              #activeHelpKey: #makeBottomAbsolute
                              #model: #absoluteBottom
                          )
                        )
                    )
                    #label: 'Corner'
                    #labelPosition: #topLeft
                )
                 #(#MenuPanelSpec
                    #name: 'commonLayoutToolBar'
                    #layout: #(#LayoutFrame 10 0.0 224 0 0 1.0 256 0)
                    #level: 0
                    #menu: #commonFrameLayoutsMenu
                    #textDefault: true
                )
              )
          )
      )
! !

!UILayoutTool::LayoutFrame class methodsFor:'menu specs'!

commonFrameLayoutsMenu
    "This resource specification was automatically generated
     by the MenuEditor of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the MenuEditor may not be able to read the specification."

    "
     MenuEditor new openOnClass:UILayoutTool::LayoutFrame andSelector:#commonFrameLayoutsMenu
     (Menu new fromLiteralArrayEncoding:(UILayoutTool::LayoutFrame commonFrameLayoutsMenu)) startUp
    "

    <resource: #menu>

    ^
     
       #(#Menu
          
           #(
             #(#MenuItem
                #label: 'setTopHalfFrame'
                #translateLabel: true
                #isButton: true
                #nameKey: #setTopHalfFrame
                #value: #setTopHalfFrame
                #activeHelpKey: #topHalfLayout
                #labelImage: #(#ResourceRetriever #'UILayoutTool::LayoutFrame' #setTopHalfIcon)
            )
             #(#MenuItem
                #label: 'setBottomHalfFrame'
                #translateLabel: true
                #isButton: true
                #nameKey: #setBottomHalfFrame
                #value: #setBottomHalfFrame
                #activeHelpKey: #bottomHalfLayout
                #labelImage: #(#ResourceRetriever nil #setBottomHalfIcon)
            )
             #(#MenuItem
                #label: 'setLeftHalfFrame'
                #translateLabel: true
                #isButton: true
                #nameKey: #setLeftHalfFrame
                #value: #setLeftHalfFrame
                #activeHelpKey: #leftHalfLayout
                #labelImage: #(#ResourceRetriever nil #setLeftHalfIcon)
            )
             #(#MenuItem
                #label: 'setRightHalfFrame'
                #translateLabel: true
                #isButton: true
                #nameKey: #setRightHalfFrame
                #value: #setRightHalfFrame
                #activeHelpKey: #rightHalfLayout
                #labelImage: #(#ResourceRetriever nil #setRightHalfIcon)
            )
             #(#MenuItem
                #label: ''
            )
             #(#MenuItem
                #label: 'setTopLeftQuarterFrame'
                #translateLabel: true
                #isButton: true
                #activeHelpKey: #topLeftQuarterLayout
                #nameKey: #setTopLeftQuarterFrame
                #value: #setTopLeftQuarterFrame
                #labelImage: #(#ResourceRetriever nil #setTopLeftQuarterIcon)
            )
             #(#MenuItem
                #label: 'setTopRightQuarterFrame'
                #translateLabel: true
                #isButton: true
                #activeHelpKey: #topRightQuarterLayout
                #nameKey: #setTopRightQuarterFrame
                #value: #setTopRightQuarterFrame
                #labelImage: #(#ResourceRetriever nil #setToRightQuarterIcon)
            )
             #(#MenuItem
                #label: 'setBottomRightQuarterFrame'
                #translateLabel: true
                #isButton: true
                #activeHelpKey: #bottomRightQuarterLayout
                #nameKey: #setBottomRightQuarterFrame
                #value: #setBottomRightQuarterFrame
                #labelImage: #(#ResourceRetriever nil #setBottomRightQuarterIcon)
            )
             #(#MenuItem
                #label: 'setBottomLeftQuarterFrame'
                #translateLabel: true
                #activeHelpKey: #bottomLeftQuarterLayout
                #isButton: true
                #nameKey: #setBottomLeftQuarterFrame
                #value: #setBottomLeftQuarterFrame
                #labelImage: #(#ResourceRetriever nil #setBottomLeftQuarterIcon)
            )
             #(#MenuItem
                #label: ''
            )
             #(#MenuItem
                #label: 'setTopFixPartFrame'
                #translateLabel: true
                #isButton: true
                #nameKey: #setTopFixPartFrame
                #value: #setTopFixPartFrame
                #activeHelpKey: #topFixPartLayout
                #labelImage: #(#ResourceRetriever nil #setTopFixPartIcon)
            )
             #(#MenuItem
                #label: 'setBottomFixPartFrame'
                #translateLabel: true
                #isButton: true
                #nameKey: #setBottomFixPartFrame
                #value: #setBottomFixPartFrame
                #activeHelpKey: #bottomFixPartLayout
                #labelImage: #(#ResourceRetriever nil #setBottomFixPartIcon)
            )
          ) nil
          nil
      )
! !

!UILayoutTool::LayoutFrame methodsFor:'accessing'!

fetch:aView spec:aSpec
    |layout|

    layout  := UIPainterView asLayoutFrameFromView:aView.

    (self aspectFor:#leftOffset)     value:(layout leftOffset).
    (self aspectFor:#leftFraction)   value:(layout leftFraction).
    (self aspectFor:#topOffset)      value:(layout topOffset).
    (self aspectFor:#topFraction)    value:(layout topFraction).
    (self aspectFor:#rightOffset)    value:(layout rightOffset).
    (self aspectFor:#bottomOffset)   value:(layout bottomOffset).
    (self aspectFor:#rightFraction)  value:(layout rightFraction).
    (self aspectFor:#bottomFraction) value:(layout bottomFraction).

!

layout
    "returns current layout as layoutFrame
    "
    |layout|

    layout  := Smalltalk::LayoutFrame new.

    layout     leftOffset:((self aspectFor:#leftOffset)     value) ? 0.
    layout    rightOffset:((self aspectFor:#rightOffset)    value) ? 0.
    layout      topOffset:((self aspectFor:#topOffset)      value) ? 0.
    layout   bottomOffset:((self aspectFor:#bottomOffset)   value) ? 0.
    layout   leftFraction:((self aspectFor:#leftFraction)   value) ? 0.
    layout  rightFraction:((self aspectFor:#rightFraction)  value) ? 0.
    layout    topFraction:((self aspectFor:#topFraction)    value) ? 0.
    layout bottomFraction:((self aspectFor:#bottomFraction) value) ? 0.

  ^ layout

! !

!UILayoutTool::LayoutFrame methodsFor:'common frames'!

setBottomFixPartFrame
    self
        setFrameLeft:0   offset:0 
        right:1          offset:0 
        top:1            offset:-30 
        bottom:1         offset:0
!

setBottomHalfFrame
    self
        setFrameLeft:0  offset:0 
        right:1         offset:0 
        top:0.5         offset:0 
        bottom:1        offset:0
!

setBottomLeftQuarterFrame
    self
        setFrameLeft:0   offset:0 
        right:0.5        offset:0 
        top:0.5          offset:0 
        bottom:1         offset:0
!

setBottomRightQuarterFrame
    self
        setFrameLeft:0.5 offset:0 
        right:1          offset:0 
        top:0.5          offset:0 
        bottom:1         offset:0
!

setFrameLeft:lF offset:lO right:rF offset:rO top:tF offset:tO bottom:bF offset:bO
    (self aspectFor:#leftOffset)     value:lO.
    (self aspectFor:#rightOffset)    value:rO.
    (self aspectFor:#topOffset)      value:tO.
    (self aspectFor:#bottomOffset)   value:bO.

    (self aspectFor:#leftFraction)   value:lF.
    (self aspectFor:#rightFraction)  value:rF.
    (self aspectFor:#topFraction)    value:tF.
    (self aspectFor:#bottomFraction) value:bF.
!

setLeftHalfFrame
    self
        setFrameLeft:0  offset:0 
        right:0.5       offset:0 
        top:0           offset:0 
        bottom:1        offset:0
!

setRightHalfFrame
    self
        setFrameLeft:0.5 offset:0 
        right:1          offset:0 
        top:0            offset:0 
        bottom:1         offset:0
!

setTopFixPartFrame
    self
        setFrameLeft:0   offset:0 
        right:1          offset:0 
        top:0            offset:0 
        bottom:0         offset:30
!

setTopHalfFrame
    self
        setFrameLeft:0   offset:0 
        right:1          offset:0 
        top:0            offset:0 
        bottom:0.5       offset:0
!

setTopLeftQuarterFrame
    self
        setFrameLeft:0   offset:0 
        right:0.5        offset:0 
        top:0            offset:0 
        bottom:0.5       offset:0
!

setTopRightQuarterFrame
    self
        setFrameLeft:0.5 offset:0 
        right:1          offset:0 
        top:0            offset:0 
        bottom:0.5       offset:0
! !

!UILayoutTool::LayoutOrigin class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:UILayoutTool::LayoutOrigin andSelector:#windowSpec
     UILayoutTool::LayoutOrigin new openInterface:#windowSpec
     UILayoutTool::LayoutOrigin open
    "

    <resource: #canvas>

    ^
     
       #(#FullSpec
          #window: 
           #(#WindowSpec
              #name: 'UILayoutTool-LayoutOrigin'
              #layout: #(#LayoutFrame 290 0 420 0 647 0 565 0)
              #label: 'UILayoutTool-LayoutOrigin'
              #min: #(#Point 10 10)
              #max: #(#Point 1152 900)
              #bounds: #(#Rectangle 290 420 648 566)
              #usePreferredExtent: false
          )
          #component: 
           #(#SpecCollection
              #collection: 
               #(
                 #(#UISubSpecification
                    #name: 'layoutOriginSpec'
                    #layout: #(#LayoutFrame 1 0.0 6 0 0 1.0 110 0)
                    #majorKey: #UILayoutTool
                    #minorKey: #layoutOriginSpec
                )
              )
          )
      )
! !

!UILayoutTool::LayoutOrigin methodsFor:'accessing'!

fetch:aView spec:aSpec
    "fetch layoutOrigin
    "
    |layout|

    layout  := UIPainterView asLayoutFrameFromView:aView.

    (self aspectFor:#leftOffset)   value:(layout leftOffset).
    (self aspectFor:#leftFraction) value:(layout leftFraction).
    (self aspectFor:#topOffset)    value:(layout topOffset).
    (self aspectFor:#topFraction)  value:(layout topFraction).


!

layout
    "returns current layout as layoutOrigin
    "
    |layout|

    layout  := Smalltalk::LayoutOrigin new.

    layout   leftOffset:((self aspectFor:#leftOffset)   value) ? 0.
    layout    topOffset:((self aspectFor:#topOffset)    value) ? 0.
    layout leftFraction:((self aspectFor:#leftFraction) value) ? 0.
    layout  topFraction:((self aspectFor:#topFraction)  value) ? 0.

  ^ layout

! !

!UILayoutTool::Point class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:UILayoutTool::Point andSelector:#windowSpec
     UILayoutTool::Point new openInterface:#windowSpec
     UILayoutTool::Point open
    "

    <resource: #canvas>

    ^
     
       #(#FullSpec
          #window: 
           #(#WindowSpec
              #name: 'UILayoutTool-Point'
              #layout: #(#LayoutFrame 324 0 410 0 618 0 547 0)
              #label: 'UILayoutTool-Point'
              #min: #(#Point 10 10)
              #max: #(#Point 1152 900)
              #bounds: #(#Rectangle 324 410 619 548)
              #usePreferredExtent: false
          )
          #component: 
           #(#SpecCollection
              #collection: 
               #(
                 #(#UISubSpecification
                    #name: 'layoutPointSpec'
                    #layout: #(#LayoutFrame 1 0.0 6 0 0 1.0 100 0)
                    #majorKey: #UILayoutTool
                    #minorKey: #layoutPointSpec
                )
              )
          )
      )
! !

!UILayoutTool::Point methodsFor:'accessing'!

fetch:aView spec:aSpec
    "fetch point
    "
    |origin|

    origin  := aView computeOrigin.

    (self aspectFor:#leftOffset) value:(origin x).
    (self aspectFor:#topOffset)  value:(origin y).


!

layout
    "returns current layout as point
    "
  ^ Smalltalk::Point x:(((self aspectFor:#leftOffset) value) ? 0)
                     y:(((self aspectFor:#topOffset)  value) ? 0)

! !

!UILayoutTool::Rectangle class methodsFor:'interface specs'!

windowSpec
    "This resource specification was automatically generated
     by the UIPainter of ST/X."

    "Do not manually edit this!! If it is corrupted,
     the UIPainter may not be able to read the specification."

    "
     UIPainter new openOnClass:UILayoutTool::Rectangle andSelector:#windowSpec
     UILayoutTool::Rectangle new openInterface:#windowSpec
     UILayoutTool::Rectangle open
    "

    <resource: #canvas>

    ^
     
       #(#FullSpec
          #window: 
           #(#WindowSpec
              #name: 'UILayoutTool-Rectangle'
              #layout: #(#LayoutFrame 291 0 130 0 632 0 328 0)
              #label: 'UILayoutTool-Rectangle'
              #min: #(#Point 10 10)
              #max: #(#Point 1152 900)
              #bounds: #(#Rectangle 291 130 633 329)
              #usePreferredExtent: false
          )
          #component: 
           #(#SpecCollection
              #collection: 
               #(
                 #(#UISubSpecification
                    #name: 'subSpecification'
                    #layout: #(#LayoutFrame 1 0.0 6 0 0 1.0 96 0)
                    #majorKey: #UILayoutTool
                    #minorKey: #layoutPointSpec
                )
                 #(#FramedBoxSpec
                    #name: 'FramedBox'
                    #layout: #(#LayoutFrame 1 0.0 99 0 0 1.0 194 0)
                    #component: 
                     #(#SpecCollection
                        #collection: 
                         #(
                           #(#LabelSpec
                              #name: 'labelCornerY'
                              #layout: #(#AlignmentOrigin 83 0 16 0 1 0)
                              #label: 'Right:'
                              #adjust: #left
                          )
                           #(#InputFieldSpec
                              #name: 'fieldCornerX'
                              #layout: #(#LayoutFrame 85 0 13 0 135 0 35 0)
                              #activeHelpKey: #cornerX
                              #tabable: true
                              #model: #rightOffset
                              #group: #inputGroup
                              #type: #numberOrNil
                              #acceptOnLostFocus: true
                    #acceptChannel: #acceptChannel
                    #modifiedChannel: #modifiedChannel
                          )
                           #(#LabelSpec
                              #name: 'labelCornerX'
                              #layout: #(#AlignmentOrigin 83 0 41 0 1 0)
                              #label: 'Bottom:'
                              #adjust: #left
                          )
                           #(#InputFieldSpec
                              #name: 'fieldCornerY'
                              #layout: #(#LayoutFrame 85 0 38 0 135 0 60 0)
                              #activeHelpKey: #cornerY
                              #tabable: true
                              #model: #bottomOffset
                              #group: #inputGroup
                              #type: #numberOrNil
                              #acceptOnLostFocus: true
                    #acceptChannel: #acceptChannel
                    #modifiedChannel: #modifiedChannel
                          )
                        )
                    )
                    #label: 'Corner'
                    #labelPosition: #topLeft
                )
              )
          )
      )

    "Modified: / 13.8.1998 / 19:59:16 / cg"
! !

!UILayoutTool::Rectangle methodsFor:'accessing'!

fetch:aView spec:aSpec
    "fetch rectangle
    "
    |origin corner|

    origin := aView computeOrigin.
    corner := aView computeCorner.

    (self aspectFor:#leftOffset)   value:(origin x).
    (self aspectFor:#rightOffset)  value:(corner x).
    (self aspectFor:#topOffset)    value:(origin y).
    (self aspectFor:#bottomOffset) value:(corner y).


!

layout
    "returns current layout as rectangle
    "
  ^ Smalltalk::Rectangle left:(((self aspectFor:#leftOffset)   value) ? 0)
                          top:(((self aspectFor:#topOffset)    value) ? 0)
                        right:(((self aspectFor:#rightOffset)  value) ? 0)
                       bottom:(((self aspectFor:#bottomOffset) value) ? 0)


! !

!UILayoutTool class methodsFor:'documentation'!

version
    ^ '$Header$'
! !