diff --git a/src/OpalCompiler-Core/OpalCompiler.class.st b/src/OpalCompiler-Core/OpalCompiler.class.st index 30f3dfb46d4..70abb3ef9ad 100644 --- a/src/OpalCompiler-Core/OpalCompiler.class.st +++ b/src/OpalCompiler-Core/OpalCompiler.class.st @@ -467,7 +467,7 @@ OpalCompiler >> evaluate [ ast ifNil: [ ^ doItMethod ]. value := self semanticScope evaluateDoIt: doItMethod. - self logged == true ifTrue: [ self semanticScope announceDoItEvaluation: source by: SystemAnnouncer uniqueInstance ]. + self logged == true ifTrue: [ self semanticScope announceDoItEvaluation: source by: self class codeSupportAnnouncer ]. ^ value ] diff --git a/src/OpalCompiler-Tests/OCArrayLiteralTest.class.st b/src/OpalCompiler-Tests/OCArrayLiteralTest.class.st index efcf4d104f9..762f9192d6e 100644 --- a/src/OpalCompiler-Tests/OCArrayLiteralTest.class.st +++ b/src/OpalCompiler-Tests/OCArrayLiteralTest.class.st @@ -9,7 +9,7 @@ Class { { #category : 'running' } OCArrayLiteralTest >> runCase [ - SystemAnnouncer uniqueInstance suspendAllWhile: [ super runCase ] + self class codeChangeAnnouncer suspendAllWhile: [ super runCase ] ] { #category : 'running' } diff --git a/src/OpalCompiler-Tests/OCCompilerTest.class.st b/src/OpalCompiler-Tests/OCCompilerTest.class.st index 7441c333e9f..9d4cc45bda9 100644 --- a/src/OpalCompiler-Tests/OCCompilerTest.class.st +++ b/src/OpalCompiler-Tests/OCCompilerTest.class.st @@ -53,7 +53,8 @@ OCCompilerTest >> notify: aString at: aSmallInteger in: aReadStream [ { #category : 'running' } OCCompilerTest >> runCase [ - SystemAnnouncer uniqueInstance suspendAllWhile: [ super runCase ] + + self class codeChangeAnnouncer suspendAllWhile: [ super runCase ] ] { #category : 'running' } diff --git a/src/Refactoring-Changes-Tests/RBRefactoringChangeTest.class.st b/src/Refactoring-Changes-Tests/RBRefactoringChangeTest.class.st index 705f0bba6e3..1576f9db4f8 100644 --- a/src/Refactoring-Changes-Tests/RBRefactoringChangeTest.class.st +++ b/src/Refactoring-Changes-Tests/RBRefactoringChangeTest.class.st @@ -50,10 +50,10 @@ RBRefactoringChangeTest >> exampleTraits [ RBRefactoringChangeTest >> performAndUndoChange: aChange do: aBlock [ "Perform a change in the system silently, evaluate aBlock and then undo the change again." - | undo | - ^ SystemAnnouncer uniqueInstance suspendAllWhile: [ - undo := aChange execute. - aBlock ensure: [ undo execute ] ] + ^ self class codeChangeAnnouncer suspendAllWhile: [ + | undo | + undo := aChange execute. + aBlock ensure: [ undo execute ] ] ] { #category : 'mocking' } diff --git a/src/Refactoring-Transformations-Tests/RBAbstractTransformationTest.class.st b/src/Refactoring-Transformations-Tests/RBAbstractTransformationTest.class.st index 81922742157..b52c23725fe 100644 --- a/src/Refactoring-Transformations-Tests/RBAbstractTransformationTest.class.st +++ b/src/Refactoring-Transformations-Tests/RBAbstractTransformationTest.class.st @@ -32,10 +32,10 @@ RBAbstractTransformationTest >> parserClass [ RBAbstractTransformationTest >> performAndUndoChange: aChange do: aBlock [ "Perform a change in the system silently, evaluate aBlock and then undo the change again." - | undo | - ^ SystemAnnouncer uniqueInstance suspendAllWhile: [ - undo := aChange execute. - aBlock ensure: [ undo execute ] ] + ^ self class codeChangeAnnouncer suspendAllWhile: [ + | undo | + undo := aChange execute. + aBlock ensure: [ undo execute ] ] ] { #category : 'running' } diff --git a/src/Rubric/RubTextEditor.class.st b/src/Rubric/RubTextEditor.class.st index 666ca4b805a..9b43109dfcb 100644 --- a/src/Rubric/RubTextEditor.class.st +++ b/src/Rubric/RubTextEditor.class.st @@ -1661,7 +1661,6 @@ RubTextEditor >> nextWord: position [ Position N + 1 is after the Nth character" initialPosition := 1 max: position. index := initialPosition. - position traceCr. string := self string. size := string size + 1.