Skip to content

Commit

Permalink
Fix: testAPI with updates to new API of refactorings/transformations
Browse files Browse the repository at this point in the history
  • Loading branch information
balsa-sarenac committed May 3, 2024
1 parent 4b7d094 commit 13a27a6
Show file tree
Hide file tree
Showing 2 changed files with 16 additions and 1 deletion.
Original file line number Diff line number Diff line change
Expand Up @@ -68,7 +68,7 @@ RBAbstractTransformationTest >> testAPI [
select: [ :each |
| selectors |
selectors := each methods collect: [:m | m selector].
each subclasses isEmpty and: [ (selectors includes: #buildTransformations) not ] ].
each subclasses isEmpty and: [ (selectors includes: #buildTransformations) not and: [ (selectors includes: #buildTransformationFor:) not ] ] ].
self assertEmpty: incompleteTransformations
]

Expand Down
Original file line number Diff line number Diff line change
Expand Up @@ -65,3 +65,18 @@ ReCompositeExtractSetUpMethodRefactoring >> extractSetUpCode: sourceCodeString f
class := self model classNamed: aClassName.
newSelector := #setUp
]

{ #category : 'storing' }
ReCompositeExtractSetUpMethodRefactoring >> storeOn: aStream [

aStream nextPut: $(.
self class storeOn: aStream.
aStream nextPutAll: ' extractSetUpCode: '''.
sourceCode storeOn: aStream.
aStream
nextPutAll: ''' fromMethod: #';
nextPutAll: selector asString;
nextPutAll: ' inClass: '.
class storeOn: aStream.
aStream nextPut: $)
]

0 comments on commit 13a27a6

Please sign in to comment.