Skip to content

Commit 6d01f4c

Browse files
authored
Merge pull request #18657 from Ducasse/cleaningUIManager
Make sure that we move on Morphic fading out.
2 parents a1aeae0 + 8b2ee42 commit 6d01f4c

File tree

16 files changed

+58
-121
lines changed

16 files changed

+58
-121
lines changed

bootstrap/scripts/4-build.sh

100755100644
File mode changed.

bootstrap/scripts/runKernelTests.sh

100755100644
File mode changed.

src/Calypso-Browser/ClyBrowserMorph.class.st

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -311,7 +311,7 @@ ClyBrowserMorph >> close [
311311
{ #category : 'tools support' }
312312
ClyBrowserMorph >> confirmDiscardChanges [
313313

314-
^self confirm: 'Changes have not been saved.
314+
^ (Smalltalk at: #StPharoApplication) current confirm: 'Changes have not been saved.
315315
Is it OK to discard changes?'
316316
]
317317

src/Calypso-SystemPlugins-ClassScripts-Queries/ClyClassScriptsExample.class.st

Lines changed: 27 additions & 11 deletions
Original file line numberDiff line numberDiff line change
@@ -9,40 +9,56 @@ Class {
99
#package : 'Calypso-SystemPlugins-ClassScripts-Queries'
1010
}
1111

12-
{ #category : 'class initialization' }
13-
ClyClassScriptsExample class >> initialize [
14-
self inform: 'it is class initialization example from ', self name
15-
]
16-
1712
{ #category : 'methods with examples' }
1813
ClyClassScriptsExample class >> methodWithExample [
14+
"
15+
Don't use self inform: it does not exist anymore
16+
But you can get the logic of the pragma.
17+
1918
<example>
20-
self inform: 'it is example string from ', self name.
21-
22-
^'it is example string'
19+
^ 'it is example string from ', self name.
20+
"
2321
]
2422

2523
{ #category : 'methods with samples' }
2624
ClyClassScriptsExample class >> methodWithSample [
25+
"
26+
Don't use self inform: it does not exist anymore
27+
But you can get the logic of the pragma.
28+
2729
<sampleInstance>
2830
29-
^'it is string sample instance from ', self name
31+
^'it is string sample instance from ', self name"
3032
]
3133

3234
{ #category : 'methods with scripts' }
3335
ClyClassScriptsExample class >> methodWithScript [
36+
"
37+
Don't use self inform: it does not exist anymore
38+
But you can get the logic of the pragma.
39+
3440
<script>
35-
self inform: 'It is example method with script from ', self name
41+
self inform: 'It is example method with script from ', self name"
3642
]
3743

3844
{ #category : 'methods with scripts' }
3945
ClyClassScriptsExample class >> methodWithScriptWithArgument [
40-
<script: 'self inform: ''It is example method with script with argument from '', self name'>
46+
"
47+
Don't use self inform: it does not exist anymore
48+
But you can get the logic of the pragma.
49+
50+
<script: 'self inform: ''It is example method with script with argument from '', self name'>"
4151
]
4252

4353
{ #category : 'methods with script' }
4454
ClyClassScriptsExample >> instSideMethodWithScriptWithArgument [
55+
"
56+
Don't use self inform: it does not exist anymore
57+
But you can get the logic of the pragma.
58+
59+
4560
<script: 'self inform: ''It is example inst side method with script with argument from '', self name'>
61+
"
4662
]
4763

4864
{ #category : 'see class side' }

src/Calypso-SystemTools-QueryBrowser/ClyBrowserMorph.extension.st

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -95,7 +95,7 @@ ClyBrowserMorph >> spawnQueryBrowserOn: aQuery withState: navigationBlock [
9595
In that case we do not need a query browser because it will be always empty and useless"
9696
targetQuery semiAsync hasEmptyResult ifTrue: [
9797
"For slow queries we will not wait and open a browser to indicate execution progress"
98-
^self inform: 'There are no ', targetQuery description ] ].
98+
^ (Smalltalk at: #StPharoApplication) current inform: 'There are no ', targetQuery description ] ].
9999

100100
self
101101
spawnBrowser: (Smalltalk tools toolNamed: #messageList)

src/Debugger-Model/DebugContext.class.st

Lines changed: 2 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -84,7 +84,8 @@ DebugContext >> checkSelectorUnchanged: aSelector [
8484

8585
{ #category : 'ui requests' }
8686
DebugContext >> confirm: message trueChoice: trueChoice falseChoice: falseChoice [
87-
87+
self halt.
88+
"YOU SHOULD NOT CALL UIMANAGER"
8889
^ UIManager default
8990
confirm: message
9091
trueChoice: trueChoice

src/Debugger-Model/DebuggerEmmergencyLogger.class.st

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -28,7 +28,6 @@ DebuggerEmmergencyLogger >> logError: anError forSession: aDebugSession [
2828
on: Error
2929
do: [ 'a ' , anError class printString ].
3030

31-
self inform: errDescription.
3231
[
3332
Smalltalk
3433
logError: errDescription contents

src/EpiceaBrowsers/EpLogBrowserPresenter.class.st

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -250,7 +250,6 @@ EpLogBrowserPresenter >> fileOutSelection [
250250
| entries |
251251
entries := self selectedCodeChanges collect: [ :each | each content ].
252252
EpChunkExporter new
253-
"application: application;"
254253
application: StPharoApplication current;
255254
fileOut: entries.
256255

src/Kernel-CodeModel/Class.class.st

Lines changed: 1 addition & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -910,9 +910,7 @@ Class >> rename: aString [
910910
ifTrue: [^ self error: newName , ' already exists'].
911911
self setName: newName.
912912
self environment renameClass: self from: oldName.
913-
(self undeclaredRegistry includesKey: newName)
914-
ifTrue: [self inform: 'There are references to, ' , aString printString , '
915-
from the undeclared registry. Check them after this change.']
913+
916914
]
917915

918916
{ #category : 'private' }

src/Kernel-Tests/BlockClosureTest.class.st

Lines changed: 0 additions & 93 deletions
Original file line numberDiff line numberDiff line change
@@ -445,99 +445,6 @@ BlockClosureTest >> testSetUp [
445445
self assert: (aBlock method isNil or: [ aBlock method isKindOf: CompiledCode ])
446446
]
447447

448-
{ #category : 'tests' }
449-
BlockClosureTest >> testSupplyAnswerOfFillInTheBlank [
450-
451-
self
452-
assert:
453-
([ ProvideAnswerNotification signal: 'Your favorite color?' ]
454-
valueSupplyingAnswer: #( 'Your favorite color?'
455-
'blue' ))
456-
equals: 'blue'
457-
]
458-
459-
{ #category : 'tests' }
460-
BlockClosureTest >> testSupplyAnswerOfFillInTheBlankUsingDefaultAnswer [
461-
462-
self
463-
assert: ([
464-
(ProvideAnswerNotification signal: 'Your favorite color?')
465-
== #default ifTrue: [ 'red' ] ] valueSupplyingAnswer:
466-
#( 'Your favorite color?' #default ))
467-
equals: 'red'
468-
]
469-
470-
{ #category : 'tests' }
471-
BlockClosureTest >> testSupplyAnswerThroughNestedBlocks [
472-
473-
self should: [true = ([[self confirm: 'You like Smalltalk?']
474-
valueSupplyingAnswer: #('Blub' false)] valueSupplyingAnswer: #('Smalltalk' true))]
475-
]
476-
477-
{ #category : 'tests' }
478-
BlockClosureTest >> testSupplyAnswerUsingOnlySubstringOfQuestion [
479-
480-
self should: [false = ([self confirm: 'You like Smalltalk?']
481-
valueSupplyingAnswer: #('like' false))]
482-
]
483-
484-
{ #category : 'tests' }
485-
BlockClosureTest >> testSupplyAnswerUsingRegexMatchOfQuestion [
486-
487-
(String includesSelector: #matchesRegex:) ifFalse: [^ self].
488-
489-
self should: [true = ([self confirm: 'You like Smalltalk?']
490-
valueSupplyingAnswer: #('.*Smalltalk\?' true))]
491-
]
492-
493-
{ #category : 'tests' }
494-
BlockClosureTest >> testSupplyAnswerUsingTraditionalMatchOfQuestion [
495-
496-
self should: [true = ([self confirm: 'You like Smalltalk?']
497-
valueSupplyingAnswer: #('*Smalltalk#' true))]
498-
]
499-
500-
{ #category : 'tests' }
501-
BlockClosureTest >> testSupplySameAnswerToAllQuestions [
502-
503-
self should: [true = ([self confirm: 'You like Smalltalk?'] valueSupplyingAnswer: true)].
504-
505-
self should: [#(true true) = ([{self confirm: 'One'. self confirm: 'Two'}] valueSupplyingAnswer: true)]
506-
]
507-
508-
{ #category : 'tests' }
509-
BlockClosureTest >> testSupplySeveralAnswersToSeveralQuestions [
510-
511-
self should: [#(false true) = ([{self confirm: 'One'. self confirm: 'Two'}]
512-
valueSupplyingAnswers: #( ('One' false) ('Two' true) ))].
513-
514-
self should: [#(true false) = ([{self confirm: 'One'. self confirm: 'Two'}]
515-
valueSupplyingAnswers: #( ('One' true) ('Two' false) ))]
516-
]
517-
518-
{ #category : 'tests' }
519-
BlockClosureTest >> testSupplySpecificAnswerToQuestion [
520-
521-
self should: [false = ([self confirm: 'You like Smalltalk?']
522-
valueSupplyingAnswer: #('You like Smalltalk?' false))]
523-
]
524-
525-
{ #category : 'tests' }
526-
BlockClosureTest >> testSuppressInform [
527-
528-
self should: [[nil inform: 'Should not see this message or this test failed!'] valueSuppressingAllMessages isNil]
529-
]
530-
531-
{ #category : 'tests' }
532-
BlockClosureTest >> testSuppressInformUsingStringMatchOptions [
533-
534-
self should: [([nil inform: 'Should not see this message or this test failed!'] valueSuppressingMessages: #('Should not see this message or this test failed!')) isNil].
535-
536-
self should: [([nil inform: 'Should not see this message or this test failed!'] valueSuppressingMessages: #('not see this message')) isNil].
537-
538-
self should: [([nil inform: 'Should not see this message or this test failed!'] valueSuppressingMessages: #('*message*failed#')) isNil]
539-
]
540-
541448
{ #category : 'tests - evaluating' }
542449
BlockClosureTest >> testValueWithArguments [
543450

0 commit comments

Comments
 (0)