 |
 |
QotD |
"To be or not to be" – Shakespeare
|
|
        |
 |
PluggablePanelMorph
Last updated at 1:57 pm UTC on 8 November 2017
A pluggable panel morph which deals with changing children.
The only reference to this class is in
MorphicToolBuilder
panelClass
^ PluggablePanelMorph
And the only reference to this is in
MorphicToolBuilder
buildPluggablePanel: aSpec
buildPluggablePanel: aSpec
| widget |
widget := self panelClass new.
self register: widget id: aSpec name.
widget model: aSpec model.
"Set child dependent layout properties."
widget wantsPaneSplitters: (aSpec wantsResizeHandles ifNil: [false]).
self setLayoutHintsFor: widget spec: aSpec.
widget layoutInset: (aSpec padding ifNil: [0]).
widget cellInset: (aSpec spacing ifNil: [
widget wantsPaneSplitters
ifTrue: [ProportionalSplitterMorph gripThickness]
ifFalse: [2]]).
"Now create the children."
aSpec children isSymbol
ifTrue: [
widget getChildrenSelector: aSpec children.
widget update: aSpec children]
ifFalse: [
self buildAll: aSpec children in: widget].
self setFrame: aSpec frame in: widget.
self setLayout: aSpec layout in: widget.
parent ifNotNil:[self add: widget to: parent].
widget borderWidth: 0.
self buildHelpFor: widget spec: aSpec.
widget color: Color transparent.
^ widget