Skip to content

Commit

Permalink
Do not load this PR, it is just a test
Browse files Browse the repository at this point in the history
  • Loading branch information
kasperosterbye committed Jan 22, 2020
1 parent 36584ea commit dd669c7
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion src/Collections-Strings/String.class.st
Expand Up @@ -470,7 +470,7 @@ String >> alike: aString [
| i j k minSize bonus |
minSize := (j := self size) min: (k := aString size).
bonus := (j - k) abs < 2 ifTrue: [ 1 ] ifFalse: [ 0 ].
i := 1.
i := 1.
[(i <= minSize) and: [((self at: i) asInteger bitAnd: 16rDF) = ((aString at: i) asciiValue bitAnd: 16rDF)]]
whileTrue: [ i := i + 1 ].
[(j > 0) and: [(k > 0) and:
Expand Down

0 comments on commit dd669c7

Please sign in to comment.