Skip to content

Commit

Permalink
Typo: explicitely should be explicitly
Browse files Browse the repository at this point in the history
  • Loading branch information
astares committed Jul 4, 2019
1 parent 618ec5b commit 1a9cacc
Show file tree
Hide file tree
Showing 10 changed files with 13 additions and 13 deletions.
4 changes: 2 additions & 2 deletions src/Announcements-Core/AnnouncementSetWithExclusions.class.st
Expand Up @@ -24,15 +24,15 @@ Class {
{ #category : #private }
AnnouncementSetWithExclusions >> addExclusion: anAnnouncement [
"Add anAnnouncement as an exclusion to me.
I will explicitely not handle my exclusion announcements."
I will explicitly not handle my exclusion announcements."

^ exclusions add: anAnnouncement
]

{ #category : #testing }
AnnouncementSetWithExclusions >> handlesAnnouncement: anAnnouncement [
"Return true when I will handle anAnnouncement.
I extend my superclass behavior by explicitely
I extend my superclass behavior by explicitly
not handling the exclusions."

^ (super handlesAnnouncement: anAnnouncement)
Expand Down
6 changes: 3 additions & 3 deletions src/Kernel/ExceptionSetWithExclusions.class.st
Expand Up @@ -13,23 +13,23 @@ Class {
{ #category : #exceptionselector }
ExceptionSetWithExclusions >> - exception [
"Add exception as an exclusion to me.
I will explicitely not handle my exclusion exceptions."
I will explicitly not handle my exclusion exceptions."

self addExclusion: exception
]

{ #category : #private }
ExceptionSetWithExclusions >> addExclusion: exception [
"Add exception as an exclusion to me.
I will explicitely not handle my exclusion exceptions."
I will explicitly not handle my exclusion exceptions."

^ exclusions add: exception
]

{ #category : #exceptionselector }
ExceptionSetWithExclusions >> handles: exception [
"Return true when I will handled exception.
I extend my superclass behavior by explicitely
I extend my superclass behavior by explicitly
not handling a number of exclusion exceptions."

^ (super handles: exception)
Expand Down
2 changes: 1 addition & 1 deletion src/Morphic-Core/HandMorph.class.st
Expand Up @@ -863,7 +863,7 @@ HandMorph >> moveToEvent: anEvent [

{ #category : #drawing }
HandMorph >> needsToBeDrawn [
"Return true if this hand must be drawn explicitely instead of being drawn via the hardware cursor. This is the case if it (a) it is a remote hand, (b) it is showing a temporary cursor, or (c) it is not empty and there are any visible submorphs. If using the software cursor, ensure that the hardware cursor is hidden."
"Return true if this hand must be drawn explicitly instead of being drawn via the hardware cursor. This is the case if it (a) it is a remote hand, (b) it is showing a temporary cursor, or (c) it is not empty and there are any visible submorphs. If using the software cursor, ensure that the hardware cursor is hidden."
"Details: Return true if this hand has a saved patch to ensure that is is processed by the world. This saved patch will be deleted after one final display pass when it becomes possible to start using the hardware cursor again. This trick gives us one last display cycle to allow us to remove the software cursor and shadow from the display."
| cursor |
(savedPatch notNil
Expand Down
2 changes: 1 addition & 1 deletion src/Ombu-Tests/OmFileStoreTest.class.st
Expand Up @@ -148,7 +148,7 @@ OmFileStoreTest >> testLoadFromCorruptFile4 [
skip: -1;
nextPutAll: '**'.

"Apparently, in Linux it can randomly fail if not explicitely flush"
"Apparently, in Linux it can randomly fail if not explicitly flush"
stream flush.
] ensure: [ stream close ].

Expand Down
2 changes: 1 addition & 1 deletion src/Ombu/OmFileStore.class.st
Expand Up @@ -247,7 +247,7 @@ OmFileStore >> flushEntryBuffer [
nextEntryPut: entry.
].

"In Linux it was necessary to explicitely flush the file stream"
"In Linux it was necessary to explicitly flush the file stream"
fileStream flush.

lastStreamPosition := fileStream size.
Expand Down
2 changes: 1 addition & 1 deletion src/OpalCompiler-Core/IRMethod.class.st
Expand Up @@ -310,7 +310,7 @@ IRMethod >> optimize [

"This last two optimizations works but the problem
when you absorb conditional jumps
is that and: / or: chained generate explicitely
is that and: / or: chained generate explicitly
constant conditional jumps to tip the JIt and the
decompiler that they are and: or: and not conditions/loops
Expand Down
2 changes: 1 addition & 1 deletion src/OpalCompiler-Core/IRTranslatorV2.class.st
Expand Up @@ -254,7 +254,7 @@ IRTranslatorV2 >> visitPushLiteral: lit [
cannot rely on literal class isImmediateClass here or it breaks the bootstrap."
({Character.SmallInteger.SmallFloat64} includes: literal class) ifTrue: [ ^ gen pushLiteral: literal ].
Smalltalk vm supportsWriteBarrier ifFalse: [ ^ gen pushLiteral: literal ].
"For symbol we need to set explicitely to writable or read-only.
"For symbol we need to set explicitly to writable or read-only.
Compilation to read-only then back to writable keep the object
read-only if we don't set it back to writable."
compilationContext optionReadOnlyLiterals
Expand Down
2 changes: 1 addition & 1 deletion src/Tools-Test/MessageTallyTest.class.st
Expand Up @@ -99,7 +99,7 @@ MessageTallyTest >> testTallySends [
self assert: tallyForPrintStringBase receivers size equals: 1.
self assert: ((tallyForPrintStringBase receivers first tally) >= 50 ).

"We close to explicitely release reference of the process, the class and methods"
"We close to explicitly release reference of the process, the class and methods"
tally close.


Expand Down
2 changes: 1 addition & 1 deletion src/Zinc-HTTP/ZnLimitedReadStream.class.st
Expand Up @@ -53,7 +53,7 @@ ZnLimitedReadStream >> close [

{ #category : #accessing }
ZnLimitedReadStream >> collectionSpecies [
"I can be set to binary or ascii explicitely.
"I can be set to binary or ascii explicitly.
If not set, delegate to our wrapped stream."

^ binary notNil
Expand Down
2 changes: 1 addition & 1 deletion src/Zinc-HTTP/ZnServer.class.st
Expand Up @@ -500,7 +500,7 @@ ZnServer >> unregister [
{ #category : #accessing }
ZnServer >> url [
"Return the base external URL (a new ZnUrl instance) to access me.
This defaults to #localUrl but can be set explicitely using the #serverUrl option.
This defaults to #localUrl but can be set explicitly using the #serverUrl option.
Missing elements from #serverUrl are merged in from #localUrl."

^ self serverUrl
Expand Down

0 comments on commit 1a9cacc

Please sign in to comment.