Skip to content
Merged
Show file tree
Hide file tree
Changes from all commits
Commits
File filter

Filter by extension

Filter by extension

Conversations
Failed to load comments.
Loading
Jump to
Jump to file
Failed to load files.
Loading
Diff view
Diff view
4 changes: 2 additions & 2 deletions src/Commander-Activators-Shortcut/CmdShortcutSetting.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -79,8 +79,8 @@ CmdShortcutSetting >> realValue: aShortcutActivation [
CmdShortcutSetting >> setToDefault [

shortcutActivation := shortcutActivation revertRedefinedInstanceIfAbsent: [
self inform: 'Annotation not exists anymore'.
^self].
InformativeNotification signal: 'Annotation does not exist anymore'.
^ self ].

self updated
]
Expand Down
4 changes: 2 additions & 2 deletions src/Debugger-Model/DebugContext.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -52,7 +52,7 @@ DebugContext >> blockNotFoundDialog: aMethod with: aText [
message := 'Method for block not found on stack, can''t edit and continue'.

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

result := self
confirm: message
Expand All @@ -78,7 +78,7 @@ DebugContext >> checkSelectorUnchanged: aSelector [
unchanged := aSelector == self selectedMessageName
or: [ self selectedMessageName isDoIt and: [ aSelector numArgs = self selectedMessageName numArgs ] ].
unchanged
ifFalse: [ self inform: 'can''t change selector' ].
ifFalse: [ InformativeNotification signal: 'can''t change selector' ].
^ unchanged
]

Expand Down
2 changes: 1 addition & 1 deletion src/Debugger-Model/DebugSession.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -438,7 +438,7 @@ DebugSession >> rewindContextToMethod: aMethod fromContext: aContext [

ctxt == aContext
ifFalse: [
self inform: 'Method saved, but current context unchanged\because of unwind error. Click OK to see error' withCRs ]
InformativeNotification signal: 'Method saved, but current context unchanged\because of unwind error. Click OK to see error' withCRs ]
ifTrue: [
interruptedProcess restartTopWith: aMethod.
self stepToFirstInterestingBytecodeIn: interruptedProcess ].
Expand Down
2 changes: 1 addition & 1 deletion src/Debugger-Model/DebuggerEmmergencyLogger.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -34,7 +34,7 @@ DebuggerEmmergencyLogger >> logError: anError forSession: aDebugSession [
inContext: aDebugSession interruptedContext ]
on: Error
do: [ :err |
self inform: (String streamContents: [ :str |
InformativeNotification signal: (String streamContents: [ :str |
str << 'Cannot log error:'.
str space.
str << anError description.
Expand Down
2 changes: 1 addition & 1 deletion src/Monticello/MCNoChangesException.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -11,5 +11,5 @@ Class {

{ #category : 'accessing' }
MCNoChangesException >> defaultAction [
self inform: 'No changes'
InformativeNotification signal: 'No changes'
]
Original file line number Diff line number Diff line change
Expand Up @@ -66,7 +66,7 @@ RBInlineAllSendersRefactoring >> applicabilityPreconditions [
{ #category : 'transforming' }
RBInlineAllSendersRefactoring >> checkInlinedMethods [
numberReplaced = 0
ifTrue: [self inform: 'Could not find any senders to inline into']
ifTrue: [ InformativeNotification signal: 'Could not find any senders to inline into']
]

{ #category : 'transforming' }
Expand Down
6 changes: 2 additions & 4 deletions src/System-Hashing/DigitalSignatureAlgorithm.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -51,10 +51,8 @@ DigitalSignatureAlgorithm class >> example [
msg := 'This is a test...'.
keys := self testKeySet.
sig := self sign: msg privateKey: keys first.
self inform: 'Signature created'.
(self verify: sig isSignatureOf: msg publicKey: keys last)
ifTrue: [self inform: 'Signature verified.']
ifFalse: [self error: 'ERROR! Signature verification failed']
self verify: sig isSignatureOf: msg publicKey: keys last

]

{ #category : 'public' }
Expand Down
2 changes: 1 addition & 1 deletion src/Text-Edition/TextPrintIt.extension.st
Original file line number Diff line number Diff line change
Expand Up @@ -5,6 +5,6 @@ TextPrintIt >> actOnClick: anEvent for: anObject in: paragraph editor: editor [

| result |
result := Smalltalk compiler receiver: anObject; evaluate: evalString.
self inform: result printString.
InformativeNotification signal: result printString.
^ true
]
2 changes: 1 addition & 1 deletion src/Tool-Base/ToolShortcutsCategory.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -64,5 +64,5 @@ ToolShortcutsCategory >> saveImage [
shortcut: PharoShortcuts current saveImageShortcut
action: [
(Smalltalk snapshot: true andQuit: false) hasSavedSuccessfully
ifTrue: [ self inform: 'Image saved' ] ]
ifTrue: [ InformativeNotification signal: 'Image saved' ] ]
]
3 changes: 2 additions & 1 deletion src/Tools/InformDebugger.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -11,5 +11,6 @@ Class {

{ #category : 'opening api' }
InformDebugger class >> openOn: aDebugSession withFullView: aBool andNotification: aString [
self inform: (self messageToPrintFrom: aDebugSession)

InformativeNotification signal: (self messageToPrintFrom: aDebugSession)
]