Skip to content

Commit

Permalink
remove interactionState:
Browse files Browse the repository at this point in the history
  • Loading branch information
pavel-krivanek committed May 1, 2024
1 parent fa9e2f8 commit db9e39e
Show file tree
Hide file tree
Showing 3 changed files with 4 additions and 28 deletions.
6 changes: 0 additions & 6 deletions src/Morphic-Widgets-Basic/LabelMorph.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -182,12 +182,6 @@ LabelMorph >> initialize [
enabled: true
]

{ #category : 'protocol' }
LabelMorph >> interactionState: aSymbol [
"Backstop here to prevent 'legacy' color handling being applied from
pluggable buttons."
]

{ #category : 'layout' }
LabelMorph >> minHeight [
"Answer the receiver's minimum height.
Expand Down
17 changes: 4 additions & 13 deletions src/Morphic-Widgets-Basic/PluggableButtonMorph.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -333,23 +333,14 @@ PluggableButtonMorph >> browseAction [
PluggableButtonMorph >> changed [
"Update the fillStyle here."

|lc pc bs|
| aBorderStyle|
self assureExtension.
extension borderStyle: (bs := self borderStyleToUse).
borderColor := bs style.
borderWidth := bs width.
extension borderStyle: (aBorderStyle := self borderStyleToUse).
borderColor := aBorderStyle style.
borderWidth := aBorderStyle width.
extension fillStyle: self fillStyleToUse.
self layoutInset: (self theme buttonLabelInsetFor: self).
self privateColor: self fillStyle asColor.
(self labelMorph respondsTo: #interactionState:)
ifTrue: [self labelMorph interactionState: self interactionState]
ifFalse: [(self labelMorph isNil
or: [label isMorph]) ifFalse: [
pc := self normalColor.
lc := self enabled
ifTrue: [pc contrastingBlackAndWhiteColor]
ifFalse: [pc contrastingBlackAndWhiteColor muchDarker].
self labelMorph color: lc]].
super changed
]

Expand Down
9 changes: 0 additions & 9 deletions src/Morphic-Widgets-Windows/PanelMorph.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -122,15 +122,6 @@ PanelMorph >> initialize [
beSticky "stop being grabbed"
]

{ #category : 'protocol' }
PanelMorph >> interactionState: aSymbol [
"Pass on to submorphs."

self submorphsDo: [:m |
(m respondsTo: #interactionState:) ifTrue: [
m interactionState: aSymbol]]
]

{ #category : 'protocol' }
PanelMorph >> isResizeableMorph: submorph forSplitter: e [
| done |
Expand Down

0 comments on commit db9e39e

Please sign in to comment.