Skip to content

Commit

Permalink
More Icon renames, see #11356
Browse files Browse the repository at this point in the history
  • Loading branch information
Marcus Denker committed Jun 21, 2022
1 parent d2eb81a commit 64d7043
Show file tree
Hide file tree
Showing 29 changed files with 67 additions and 67 deletions.
Expand Up @@ -36,5 +36,5 @@ ClyExampleScript >> description [

{ #category : #accessing }
ClyExampleScript >> iconName [
^#smallDoItIcon
^#smallDoIt
]
Expand Up @@ -35,5 +35,5 @@ ClySampleInstanceScript >> executeOn: aClass [

{ #category : #accessing }
ClySampleInstanceScript >> iconName [
^ #smallDoItIcon
^ #smallDoIt
]
Expand Up @@ -90,11 +90,11 @@ ClyTestResultProperty >> createIcon [

allCount = 0 ifTrue: [ ^ self iconNamed: #testNotRun ].
allCount = successCount
ifTrue: [ ^ self iconNamed: #testGreenIcon ].
ifTrue: [ ^ self iconNamed: #testGreen ].
errorCount = 0 & (failureCount > 0)
ifTrue: [ ^ self iconNamed: #testYellowIcon ].
ifTrue: [ ^ self iconNamed: #testYellow ].
errorCount > 0
ifTrue: [ ^ self iconNamed: #testRedIcon ].
ifTrue: [ ^ self iconNamed: #testRed].

^ self iconNamed: #testNotRun
]
Expand Down
6 changes: 3 additions & 3 deletions src/EpiceaBrowsers/EpIconVisitor.class.st
Expand Up @@ -129,7 +129,7 @@ EpIconVisitor >> visitProtocolRemoval: aProtocolChange [

{ #category : #visitor }
EpIconVisitor >> visitRedo: aRedoEvent [
^ self iconNamed: #smallRedoIcon
^ self iconNamed: #smallRedo
]

{ #category : #visitor }
Expand All @@ -149,7 +149,7 @@ EpIconVisitor >> visitSessionSnapshot: aSnapshotChange [

{ #category : #visitor }
EpIconVisitor >> visitSessionStart: anEvent [
^ self iconNamed: #smallDoItIcon
^ self iconNamed: #smallDoIt
]

{ #category : #visitor }
Expand All @@ -169,5 +169,5 @@ EpIconVisitor >> visitTraitRemoval: aTraitRemoval [

{ #category : #visitor }
EpIconVisitor >> visitUndo: anUndoEvent [
^ self iconNamed: #smallUndoIcon
^ self iconNamed: #smallUndo
]
8 changes: 4 additions & 4 deletions src/EpiceaBrowsers/EpLogBrowserPresenter.class.st
Expand Up @@ -231,12 +231,12 @@ EpLogBrowserPresenter >> codeChangesMenuActions [
{ 'Apply...'.
#openPreviewToApplySelectedChanges.
'Preview the application of selected code changes (open a new window to show the effect of re-applying the changes in current image)'.
#smallRedoIcon.
#smallRedo.
$p command }.
{ 'Revert...'.
#openPreviewToRevertSelectedChanges.
'Preview the reversion of selected code changes (open a new window to show the effect of reverting the changes in current image)'.
#smallUndoIcon.
#smallUndo.
$r command }.
{ 'Browse current'.
#browseSelection.
Expand Down Expand Up @@ -712,12 +712,12 @@ EpLogBrowserPresenter >> refactoringMenuActions [
{ 'Apply refactoring'.
#applyCompleteRefactoringInSelection.
'Apply selected refactoring'.
#smallRedoIcon.
#smallRedo.
$y command }.
{ 'Apply secondary effects of refactoring'.
#applyPropagateRefactoringInSelection.
'Apply only the secondary effects of the selected refactoring'.
#smallRedoIcon.
#smallRedo.
$s command }
}
]
Expand Down
4 changes: 2 additions & 2 deletions src/EpiceaBrowsers/EpLogBrowserToolbarPresenter.class.st
Expand Up @@ -28,7 +28,7 @@ EpLogBrowserToolbarPresenter >> activeFiltersString [
{ #category : #accessing }
EpLogBrowserToolbarPresenter >> beApplyMode [
filtersButton
icon: (self iconNamed: #smallRedoIcon);
icon: (self iconNamed: #smallRedo);
label: 'Confirm All Changes';
action: [ logBrowserPresenter applyAllChangesAndCloseWindow ]
]
Expand All @@ -45,7 +45,7 @@ EpLogBrowserToolbarPresenter >> beHistoryMode [
{ #category : #accessing }
EpLogBrowserToolbarPresenter >> beRevertMode [
filtersButton
icon: (self iconNamed: #smallUndoIcon);
icon: (self iconNamed: #smallUndo);
label: 'Confirm All Changes';
action: [ logBrowserPresenter revertAllChangesAndCloseWindow ]
]
Expand Down
2 changes: 1 addition & 1 deletion src/EpiceaBrowsers/EpUnifiedBrowserPresenter.class.st
Expand Up @@ -99,7 +99,7 @@ EpUnifiedBrowserPresenter >> initializeToolbar [
action: [ self refreshLogs ];
yourself);
add: (self newToolbarButton
icon: (self application iconNamed: #openIcon);
icon: (self application iconNamed: #open);
label: 'Directory';
help: 'Select directory to browse logs (i.e. files with ombu extension)';
action: [ self selectDirectory ];
Expand Down
2 changes: 1 addition & 1 deletion src/MenuRegistration/MenuRegistrationExample.class.st
Expand Up @@ -101,7 +101,7 @@ MenuRegistrationExample class >> toolsOn: aBuilder [
(aBuilder item: #Tools)
order: 1.0;
target: Smalltalk tools;
iconName: #smallDoItIcon;
iconName: #smallDoIt;
withSeparatorAfter;
with: [(aBuilder item: #Transcript) selector: #openTranscript; icon: Smalltalk tools transcript taskbarIcon.
(aBuilder item: #'File Browser') selector: #openFileList; icon: Smalltalk tools fileList taskbarIcon.
Expand Down
4 changes: 2 additions & 2 deletions src/Morphic-Core/Morph.class.st
Expand Up @@ -415,10 +415,10 @@ Morph >> addExportMenuItems: aMenu hand: aHandMorph [
aSubMenu add: 'PNG file' selector: #exportAsPNG.
aMenu
add: 'export...'
icon: (self iconNamed: #smallExportIcon)
icon: (self iconNamed: #smallExport)
subMenu: aSubMenu.
aMenu lastItem
icon: (self iconNamed: #smallExportIcon) ]
icon: (self iconNamed: #smallExport) ]
]

{ #category : #menus }
Expand Down
2 changes: 1 addition & 1 deletion src/Morphic-Examples/ClassListExample.class.st
Expand Up @@ -107,7 +107,7 @@ ClassListExample >> treeMorph [
rowMorphGetSelector: #commentText;
headerButtonLabel: 'Comments'
font: nil
icon: (self iconNamed: #smallPrintIcon)
icon: (self iconNamed: #smallPrint)
target: nil
actionSelector: nil
arguments: #())};
Expand Down
2 changes: 1 addition & 1 deletion src/Morphic-Examples/PluggableButtonMorphExample.class.st
Expand Up @@ -144,7 +144,7 @@ PluggableButtonMorphExample >> initialize [
super initialize.
label := 'Test label'.
state := #on.
icon := self iconNamed: #smallOkIcon
icon := self iconNamed: #smallOk
]

{ #category : #accessing }
Expand Down
8 changes: 4 additions & 4 deletions src/Morphic-Examples/WidgetExample.class.st
Expand Up @@ -394,7 +394,7 @@ WidgetExample class >> exampleWindowWithToolbars [
selector: #print.
fileMenu lastItem
font: win theme menuFont;
icon: (self iconNamed: #smallPrintIcon);
icon: (self iconNamed: #smallPrint);
keyText: 'Ctrl+P'.
tools := win
newToolbar:
Expand All @@ -404,7 +404,7 @@ WidgetExample class >> exampleWindowWithToolbars [
action: #openFile
arguments: nil
getEnabled: nil
labelForm: (self iconNamed: #smallOpenIcon)
labelForm: (self iconNamed: #smallOpen)
help: 'Open file' translated). "if we had a model it would go here"
(win
newButtonFor: nil
Expand All @@ -420,7 +420,7 @@ WidgetExample class >> exampleWindowWithToolbars [
action: #print
arguments: nil
getEnabled: nil
labelForm: (self iconNamed: #smallPrintIcon)
labelForm: (self iconNamed: #smallPrint)
help: 'Print' translated)}.
holder := NewValueHolder new.
text := win
Expand All @@ -431,7 +431,7 @@ WidgetExample class >> exampleWindowWithToolbars [
dock
add: 'File' translated
font: win theme menuBarFont
icon: (self iconNamed: #smallOpenIcon)
icon: (self iconNamed: #smallOpen)
help: 'File operations' translated
subMenu: fileMenu;
addMorphBack: tools.
Expand Down
Expand Up @@ -33,23 +33,23 @@ FTExampleClassInfoTableDataSource >> iconFor: index [
includesBehavior: (Smalltalk globals at: #TestCase ifAbsent: [ false ]))
and: [ class isAbstract not ])
ifTrue: [ class hasPassedTest
ifTrue: [ ^ self iconNamed: #testGreenIcon ].
ifTrue: [ ^ self iconNamed: #testGreen ].
class hasFailedTest
ifTrue: [ ^ self iconNamed: #testYellowIcon ].
ifTrue: [ ^ self iconNamed: #testYellow ].
class hasErrorTest
ifTrue: [ ^ self iconNamed: #testRedIcon ].
ifTrue: [ ^ self iconNamed: #testRed ].
^ self iconNamed: #testNotRun ].
class organization classComment
ifEmpty: [ ^ self iconNamed: #uncommentedClassIcon ].
ifEmpty: [ ^ self iconNamed: #uncommentedClass].
((class
includesBehavior: (Smalltalk globals at: #TestCase ifAbsent: [ false ]))
and: [ class isAbstract not ])
ifTrue: [ class hasPassedTest
ifTrue: [ ^ self iconNamed: #testGreenIcon ].
ifTrue: [ ^ self iconNamed: #testGreen ].
class hasFailedTest
ifTrue: [ ^ self iconNamed: #testYellowIcon ].
ifTrue: [ ^ self iconNamed: #testYellow ].
class hasErrorTest
ifTrue: [ ^ self iconNamed: #testRedIcon ].
ifTrue: [ ^ self iconNamed: #testRed ].
^ self iconNamed: #testNotRun ].
class organization classComment
ifEmpty: [ ^ self iconNamed: #uncommentedClass ].
Expand Down
14 changes: 7 additions & 7 deletions src/Morphic-Widgets-FastTable/FTExampleDataSource.class.st
Expand Up @@ -34,25 +34,25 @@ FTExampleDataSource >> iconFor: index [
includesBehavior: (Smalltalk globals at: #TestCase ifAbsent: [ false ]))
and: [ class isAbstract not ])
ifTrue: [ class hasPassedTest
ifTrue: [ ^ self iconNamed: #testGreenIcon ].
ifTrue: [ ^ self iconNamed: #testGreen ].
class hasFailedTest
ifTrue: [ ^ self iconNamed: #testYellowIcon ].
ifTrue: [ ^ self iconNamed: #testYellow ].
class hasErrorTest
ifTrue: [ ^ self iconNamed: #testRedIcon ].
ifTrue: [ ^ self iconNamed: #testRed ].
^ self iconNamed: #testNotRun ].
class organization classComment
ifEmpty: [ ^ self iconNamed: #uncommentedClass ].
((class
includesBehavior: (Smalltalk globals at: #TestCase ifAbsent: [ false ]))
and: [ class isAbstract not ])
ifTrue: [ class hasPassedTest
ifTrue: [ ^ self iconNamed: #testGreenIcon ].
ifTrue: [ ^ self iconNamed: #testGreen].
class hasFailedTest
ifTrue: [ ^ self iconNamed: #testYellowIcon ].
ifTrue: [ ^ self iconNamed: #testYellow].
class hasErrorTest
ifTrue: [ ^ self iconNamed: #testRedIcon ].
ifTrue: [ ^ self iconNamed: #testRed ].
^ self iconNamed: #testNotRun ].
class organization classComment
ifEmpty: [ ^ self iconNamed: #uncommentedClassIcon ].
ifEmpty: [ ^ self iconNamed: #uncommentedClass ].
^ class systemIcon
]
2 changes: 1 addition & 1 deletion src/Polymorph-Widgets/ChooseDropListDialogWindow.class.st
Expand Up @@ -22,7 +22,7 @@ ChooseDropListDialogWindow class >> taskbarIconName [
ChooseDropListDialogWindow >> icon [
"Answer an icon for the receiver."

^ self iconNamed: #questionIcon
^ self iconNamed: #question
]

{ #category : #initialization }
Expand Down
Expand Up @@ -24,7 +24,7 @@ Class {
PopupChoiceDialogWindowWithMessage >> icon [
"Answer an icon for the receiver."

^ self iconNamed: #questionIcon
^ self iconNamed: #question
]

{ #category : #accessing }
Expand Down
2 changes: 1 addition & 1 deletion src/Polymorph-Widgets/ProceedDialogWindow.class.st
Expand Up @@ -27,7 +27,7 @@ ProceedDialogWindow >> handlesKeyboard: evt [
ProceedDialogWindow >> icon [
"Answer an icon for the receiver."

^ self iconNamed: #questionIcon
^ self iconNamed: #question
]

{ #category : #'event handling' }
Expand Down
2 changes: 1 addition & 1 deletion src/Polymorph-Widgets/TextEditorDialogWindow.class.st
Expand Up @@ -66,7 +66,7 @@ TextEditorDialogWindow >> entryText: anObject [
TextEditorDialogWindow >> icon [
"Answer an icon for the receiver."

^ self iconNamed: #questionIcon
^ self iconNamed: #question
]

{ #category : #initialization }
Expand Down
6 changes: 3 additions & 3 deletions src/Rubric/RubPlainTextMode.class.st
Expand Up @@ -72,7 +72,7 @@ RubPlainTextMode class >> menuOn: aBuilder [
(aBuilder item: #Undo translated)
keyText: 'z';
selector: #undo;
iconName: #smallUndoIcon;
iconName: #smallUndo;
withSeparatorAfter.
self fontMenuOn: aBuilder ].
(aBuilder item: #Copy translated)
Expand All @@ -91,14 +91,14 @@ RubPlainTextMode class >> menuOn: aBuilder [
iconName: #smallPaste.
(aBuilder item: #'Paste Recent' translated)
selector: #pasteRecent;
iconName: #smallCopyIcon;
iconName: #smallCopy;
withSeparatorAfter.
(aBuilder model model notNil and: [ aBuilder model acceptAllowed ])
ifTrue: [
(aBuilder item: #Accept translated)
keyText: 's';
selector: #accept;
iconName: #smallOkIcon.
iconName: #smallOk.
(aBuilder item: #Cancel translated)
keyText: 'l';
selector: #cancel;
Expand Down
12 changes: 6 additions & 6 deletions src/Rubric/RubSmalltalkCodeMode.class.st
Expand Up @@ -27,7 +27,7 @@ RubSmalltalkCodeMode class >> label [

{ #category : #menu }
RubSmalltalkCodeMode class >> menuKeyword [
^ 'RubSmalltalkCodeMenu'
^ #RubSmalltalkCodeMenu
]

{ #category : #menu }
Expand All @@ -41,7 +41,7 @@ RubSmalltalkCodeMode class >> menuOn: aBuilder [
keyText: 'd';
selector: #doIt;
help: nil;
iconName: #smallDoItIcon.
iconName: #smallDoIt.
(aBuilder item: #'Print it' translated)
keyText: 'p';
selector: #printIt;
Expand Down Expand Up @@ -81,12 +81,12 @@ RubSmalltalkCodeMode class >> menuOn: aBuilder [
keyText: 'Z';
selector: #redo;
help: nil;
iconName: #smallRedoIcon.
iconName: #smallRedo.
(aBuilder item: #Undo translated)
keyText: 'z';
selector: #undo;
help: nil;
iconName: #smallUndoIcon;
iconName: #smallUndo;
withSeparatorAfter.
(aBuilder item: #Copy translated)
keyText: 'c';
Expand All @@ -106,15 +106,15 @@ RubSmalltalkCodeMode class >> menuOn: aBuilder [
(aBuilder item: #'Paste Recent' translated)
selector: #pasteRecent;
help: nil;
iconName: #smallCopyIcon;
iconName: #smallCopy;
withSeparatorAfter.
aBuilder model
ifNotNil: [ :mod |
mod model
ifNotNil: [ (aBuilder item: #Accept translated)
keyText: 's';
selector: #accept;
iconName: #smallOkIcon.
iconName: #smallOk.
(aBuilder item: #Cancel translated)
keyText: 'l';
selector: #cancel;
Expand Down
2 changes: 1 addition & 1 deletion src/Settings-Graphics/GraphicFontSettings.class.st
Expand Up @@ -69,7 +69,7 @@ GraphicFontSettings class >> resetAllFontToDefaultButton [
newRowIn: self
for:
{(AlphaImageMorph new
image: (self iconNamed: #smallRedoIcon)).
image: (self iconNamed: #smallRedo)).
(self theme buttonLabelForText: 'Force all' translated)});
yourself
]
Expand Down
4 changes: 2 additions & 2 deletions src/System-Settings-Browser/SystemSettingLauncher.class.st
Expand Up @@ -12,7 +12,7 @@ Class {

{ #category : #accessing }
SystemSettingLauncher >> defaultIcon [
^ self iconNamed: #smallDoItIcon
^ self iconNamed: #smallDoIt
]

{ #category : #accessing }
Expand All @@ -31,7 +31,7 @@ SystemSettingLauncher >> inputWidget [
newRowIn: self
for:
{(AlphaImageMorph new
image: (self iconNamed: #smallRedoIcon)).
image: (self iconNamed: #smallRedo)).
(self theme buttonLabelForText: 'Launch' translated)});
yourself
]
Expand Down
Expand Up @@ -40,7 +40,7 @@ SycExtractTempCommand >> asRefactorings [

{ #category : #accessing }
SycExtractTempCommand >> defaultMenuIconName [
^ ##smallUpdateIcon
^ ##smallUpdate
]

{ #category : #accessing }
Expand Down

0 comments on commit 64d7043

Please sign in to comment.