Skip to content

Commit

Permalink
Cleanup newlines and blanks in "CodeExport" and "CodeImport" packages
Browse files Browse the repository at this point in the history
Fix #10412
  • Loading branch information
astares committed Nov 24, 2021
1 parent aeedcbc commit 50b6c91
Show file tree
Hide file tree
Showing 7 changed files with 4 additions and 15 deletions.
1 change: 0 additions & 1 deletion src/CodeExport/Class.extension.st
Expand Up @@ -70,7 +70,6 @@ Class >> fileOutSharedPoolsOn: aFileStream [
poolsToFileOut := self sharedPools select:
[:aPool | (self shouldFileOutPool: (self environment keyAtIdentityValue: aPool))].
poolsToFileOut do: [:aPool | self fileOutPool: aPool onFileStream: aFileStream].

]

{ #category : #'*CodeExport' }
Expand Down
3 changes: 1 addition & 2 deletions src/CodeExport/ClassDescription.extension.st
Expand Up @@ -3,7 +3,7 @@ Extension { #name : #ClassDescription }
{ #category : #'*CodeExport' }
ClassDescription >> fileOutCategory: catName [

self organization fileOutCategory: catName
self organization fileOutCategory: catName
]

{ #category : #'*CodeExport' }
Expand Down Expand Up @@ -103,7 +103,6 @@ ClassDescription >> printCategoryChunk: category on: aFileStream withStamp: chan
[strm nextPutAll: ' stamp: '; print: changeStamp].
priorMethod ~~ nil ifTrue:
[strm nextPutAll: ' prior: '; print: priorMethod sourcePointer]]).

]

{ #category : #'*CodeExport' }
Expand Down
3 changes: 1 addition & 2 deletions src/CodeExport/SystemOrganizer.extension.st
Expand Up @@ -14,7 +14,6 @@ SystemOrganizer >> fileOut [
writeSourceCodeFrom: internalStream
baseName: 'SystemOrganization.st' asFileReference nextVersion basenameWithoutExtension
isSt: true

]

{ #category : #'*CodeExport' }
Expand All @@ -25,7 +24,7 @@ SystemOrganizer >> fileOutCategory: category [
| internalStream |
internalStream := (String new: 1000) writeStream.
self fileOutCategory: category on: internalStream.
^ CodeExporter writeSourceCodeFrom: internalStream baseName: category isSt: true
^ CodeExporter writeSourceCodeFrom: internalStream baseName: category isSt: true
]

{ #category : #'*CodeExport' }
Expand Down
4 changes: 2 additions & 2 deletions src/CodeImport/ChunkFileFormatParser.class.st
Expand Up @@ -25,7 +25,7 @@ ChunkFileFormatParser class >> for: aReadStream [

{ #category : #accessing }
ChunkFileFormatParser >> addDeclaration: aDeclaration [
parsedDeclarations add: aDeclaration
parsedDeclarations add: aDeclaration
]

{ #category : #'class factory' }
Expand Down Expand Up @@ -127,7 +127,7 @@ ChunkFileFormatParser >> methodsForSelector: anObject [
{ #category : #parsing }
ChunkFileFormatParser >> parseChunks [
[ readStream atEnd ] whileFalse: [ self parseNextDeclaration ].
^ parsedDeclarations
^ parsedDeclarations
]

{ #category : #parsing }
Expand Down
3 changes: 0 additions & 3 deletions src/CodeImport/CodeImporter.class.st
Expand Up @@ -57,15 +57,13 @@ CodeImporter class >> chunksFromFileNamed: aFileName [
^ (self fileNamed: aFileName)
parseChunks;
codeDeclarations.

]

{ #category : #'instance creation' }
CodeImporter class >> chunksFromStream: aStream [
^ (self fileStream: aStream)
parseChunks;
codeDeclarations.

]

{ #category : #evaluating }
Expand All @@ -91,7 +89,6 @@ CodeImporter class >> evaluateString: aString [
{ #category : #'instance creation' }
CodeImporter class >> fileNamed: aFileName [
^ self new file: (aFileName asFileReference readStream).

]

{ #category : #'instance creation' }
Expand Down
2 changes: 0 additions & 2 deletions src/CodeImport/MissingClassError.class.st
Expand Up @@ -66,12 +66,10 @@ MissingClassError >> isResumable [
MissingClassError >> superclassName [

^ superclassName ifNil: [ superclassName := 'Object' ]

]

{ #category : #accessing }
MissingClassError >> superclassName: aString [

superclassName := aString

]
Expand Up @@ -181,15 +181,13 @@ STCommandLineHandler >> installSourceFiles [
[ sourceFiles do: [ :reference |
self installSourceFile: reference ]
] ensure: [ sourceFiles := nil ].

]

{ #category : #loading }
STCommandLineHandler >> loadSourceFiles: anArray [
"Load all the source files in the given array."

sourceFiles := anArray collect: [ :each | File named: each ].

]

{ #category : #activation }
Expand All @@ -211,5 +209,4 @@ STCommandLineHandler >> skipShebangFrom: readStream [

"here we found the shebang, so skip the first line"
^ readStream nextLine.

]

0 comments on commit 50b6c91

Please sign in to comment.