Skip to content

Commit

Permalink
Remove unused methods and cleanups
Browse files Browse the repository at this point in the history
- use correct method to find methods to be checked
- rename temp that overrided instance variable
  • Loading branch information
balsa-sarenac committed Apr 26, 2024
1 parent c665858 commit ec479b7
Showing 1 changed file with 3 additions and 17 deletions.
Original file line number Diff line number Diff line change
Expand Up @@ -14,21 +14,13 @@ Class {
{ #category : 'query' }
EquivalentTreeChecker >> allMethodsInHierarchy [
^ ((class withAllSuperclassesUntil: Object)
flatCollect: [ :class | class methods])
flatCollect: [ :aClass | aClass methods])
]

{ #category : 'as yet unclassified' }
EquivalentTreeChecker >> allMethodsInHierarchyOf: aRBClass [

^ ((aRBClass withAllSuperclassesUntil: Object)
flatCollect: [ :class | class methods collect: [ :each | each method ] ])
]

{ #category : 'as yet unclassified' }
{ #category : 'query' }
EquivalentTreeChecker >> methodsToBeChecked [

^ (self allMethodsInHierarchyOf: self definingClass) reject: [
:m | m selector = selector ]
^ self allMethodsInHierarchy reject: [ :m | m selector = selector ]
]

{ #category : 'instance creation' }
Expand All @@ -42,9 +34,3 @@ EquivalentTreeChecker >> on: aClass [

class := model classNamed: aClass name
]

{ #category : 'instance creation' }
EquivalentTreeChecker >> rbClassFor: aClass [

^ model classNamed: aClass name
]

0 comments on commit ec479b7

Please sign in to comment.