Skip to content

Commit faf6a1d

Browse files
authored
Merge pull request #18906 from Ducasse/clean/lessInform
Cleaning a bit more inform:
2 parents 6787b72 + 75bd796 commit faf6a1d

File tree

10 files changed

+14
-15
lines changed

10 files changed

+14
-15
lines changed

src/Commander-Activators-Shortcut/CmdShortcutSetting.class.st

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -79,8 +79,8 @@ CmdShortcutSetting >> realValue: aShortcutActivation [
7979
CmdShortcutSetting >> setToDefault [
8080

8181
shortcutActivation := shortcutActivation revertRedefinedInstanceIfAbsent: [
82-
self inform: 'Annotation not exists anymore'.
83-
^self].
82+
InformativeNotification signal: 'Annotation does not exist anymore'.
83+
^ self ].
8484

8585
self updated
8686
]

src/Debugger-Model/DebugContext.class.st

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -52,7 +52,7 @@ DebugContext >> blockNotFoundDialog: aMethod with: aText [
5252
message := 'Method for block not found on stack, can''t edit and continue'.
5353

5454
"shouldn't edit doits"
55-
aMethod selector isDoIt ifTrue: [ ^ self inform: message ].
55+
aMethod selector isDoIt ifTrue: [ ^ InformativeNotification signal: message ].
5656

5757
result := self
5858
confirm: message
@@ -78,7 +78,7 @@ DebugContext >> checkSelectorUnchanged: aSelector [
7878
unchanged := aSelector == self selectedMessageName
7979
or: [ self selectedMessageName isDoIt and: [ aSelector numArgs = self selectedMessageName numArgs ] ].
8080
unchanged
81-
ifFalse: [ self inform: 'can''t change selector' ].
81+
ifFalse: [ InformativeNotification signal: 'can''t change selector' ].
8282
^ unchanged
8383
]
8484

src/Debugger-Model/DebugSession.class.st

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -438,7 +438,7 @@ DebugSession >> rewindContextToMethod: aMethod fromContext: aContext [
438438

439439
ctxt == aContext
440440
ifFalse: [
441-
self inform: 'Method saved, but current context unchanged\because of unwind error. Click OK to see error' withCRs ]
441+
InformativeNotification signal: 'Method saved, but current context unchanged\because of unwind error. Click OK to see error' withCRs ]
442442
ifTrue: [
443443
interruptedProcess restartTopWith: aMethod.
444444
self stepToFirstInterestingBytecodeIn: interruptedProcess ].

src/Debugger-Model/DebuggerEmmergencyLogger.class.st

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -34,7 +34,7 @@ DebuggerEmmergencyLogger >> logError: anError forSession: aDebugSession [
3434
inContext: aDebugSession interruptedContext ]
3535
on: Error
3636
do: [ :err |
37-
self inform: (String streamContents: [ :str |
37+
InformativeNotification signal: (String streamContents: [ :str |
3838
str << 'Cannot log error:'.
3939
str space.
4040
str << anError description.

src/Monticello/MCNoChangesException.class.st

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -11,5 +11,5 @@ Class {
1111

1212
{ #category : 'accessing' }
1313
MCNoChangesException >> defaultAction [
14-
self inform: 'No changes'
14+
InformativeNotification signal: 'No changes'
1515
]

src/Refactoring-Core/RBInlineAllSendersRefactoring.class.st

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -66,7 +66,7 @@ RBInlineAllSendersRefactoring >> applicabilityPreconditions [
6666
{ #category : 'transforming' }
6767
RBInlineAllSendersRefactoring >> checkInlinedMethods [
6868
numberReplaced = 0
69-
ifTrue: [self inform: 'Could not find any senders to inline into']
69+
ifTrue: [ InformativeNotification signal: 'Could not find any senders to inline into']
7070
]
7171

7272
{ #category : 'transforming' }

src/System-Hashing/DigitalSignatureAlgorithm.class.st

Lines changed: 2 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -51,10 +51,8 @@ DigitalSignatureAlgorithm class >> example [
5151
msg := 'This is a test...'.
5252
keys := self testKeySet.
5353
sig := self sign: msg privateKey: keys first.
54-
self inform: 'Signature created'.
55-
(self verify: sig isSignatureOf: msg publicKey: keys last)
56-
ifTrue: [self inform: 'Signature verified.']
57-
ifFalse: [self error: 'ERROR! Signature verification failed']
54+
self verify: sig isSignatureOf: msg publicKey: keys last
55+
5856
]
5957

6058
{ #category : 'public' }

src/Text-Edition/TextPrintIt.extension.st

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -5,6 +5,6 @@ TextPrintIt >> actOnClick: anEvent for: anObject in: paragraph editor: editor [
55

66
| result |
77
result := Smalltalk compiler receiver: anObject; evaluate: evalString.
8-
self inform: result printString.
8+
InformativeNotification signal: result printString.
99
^ true
1010
]

src/Tool-Base/ToolShortcutsCategory.class.st

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -64,5 +64,5 @@ ToolShortcutsCategory >> saveImage [
6464
shortcut: PharoShortcuts current saveImageShortcut
6565
action: [
6666
(Smalltalk snapshot: true andQuit: false) hasSavedSuccessfully
67-
ifTrue: [ self inform: 'Image saved' ] ]
67+
ifTrue: [ InformativeNotification signal: 'Image saved' ] ]
6868
]

src/Tools/InformDebugger.class.st

Lines changed: 2 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -11,5 +11,6 @@ Class {
1111

1212
{ #category : 'opening api' }
1313
InformDebugger class >> openOn: aDebugSession withFullView: aBool andNotification: aString [
14-
self inform: (self messageToPrintFrom: aDebugSession)
14+
15+
InformativeNotification signal: (self messageToPrintFrom: aDebugSession)
1516
]

0 commit comments

Comments
 (0)