Skip to content
Open
1 change: 0 additions & 1 deletion src/BaselineOfMorphic/BaselineOfMorphic.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -108,7 +108,6 @@ BaselineOfMorphic >> baseline: spec [
{ #category : 'actions' }
BaselineOfMorphic >> cleanUpAfterMorphicInitialization [

MCDataStream initialize.
FreeTypeCache clearCurrent.
World cleanseOtherworldlySteppers.
MCFileBasedRepository flushAllCaches
Expand Down
13 changes: 0 additions & 13 deletions src/Graphics-Files/BMPReadWriter.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -37,19 +37,6 @@ Class {
#package : 'Graphics-Files'
}

{ #category : 'testing' }
BMPReadWriter class >> readAllFrom: fd [
"MessageTally spyOn:[BMPReadWriter readAllFrom: FileDirectory default]"
fd fileNames do:[:fName|
(fName endsWith: '.bmp') ifTrue:[
[Form fromBinaryStream: (fd readOnlyFileNamed: fName)] on: Error do:[:nix].
].
].
fd directoryNames do:[:fdName|
self readAllFrom: (fd / fdName)
]
]

{ #category : 'image reading/writing' }
BMPReadWriter class >> typicalFileExtensions [
"Answer a collection of file extensions (lowercase) which files that I can read might commonly have"
Expand Down
Original file line number Diff line number Diff line change
Expand Up @@ -144,9 +144,9 @@ MCClassTraitDefinition >> packageName [
]

{ #category : 'accessing' }
MCClassTraitDefinition >> packageName: anObject [
MCClassTraitDefinition >> packageName: anString [

packageName := anObject
packageName := anString ifNotNil: [ :package | package asSymbol ]
]

{ #category : 'printing' }
Expand Down Expand Up @@ -192,5 +192,5 @@ MCClassTraitDefinition >> tagName: aString [

tagName := aString = Package rootTagName
ifTrue: [ nil ]
ifFalse: [ aString asSymbol ]
ifFalse: [ aString ifNotNil: [ aString asSymbol ] ]
]
228 changes: 0 additions & 228 deletions src/Monticello-BackwardCompatibility/MCDataStream.extension.st

This file was deleted.

This file was deleted.

40 changes: 0 additions & 40 deletions src/Monticello-Tests/MCDataStreamTest.class.st

This file was deleted.

3 changes: 2 additions & 1 deletion src/Monticello-Tests/MCFileInTest.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -66,9 +66,10 @@ MCFileInTest >> setUp [

{ #category : 'running' }
MCFileInTest >> tearDown [

(diff isNil or: [diff isEmpty not])
ifTrue: [expected updatePackage: self mockPackage].
MCDataStream initialize.

super tearDown
]

Expand Down
2 changes: 1 addition & 1 deletion src/Monticello-Tests/MCPackageTest.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -16,8 +16,8 @@ MCPackageTest >> aMethodRemoved: anEvent [

{ #category : 'running' }
MCPackageTest >> tearDown [

self mockSnapshot install.
MCDataStream initialize. "MCMockClassG ends up in the DataStream TypeMap -- we need to reset"
super tearDown
]

Expand Down
13 changes: 0 additions & 13 deletions src/Monticello/MCClassDefinition.extension.st
Original file line number Diff line number Diff line change
Expand Up @@ -7,16 +7,3 @@ MCClassDefinition >> accept: aVisitor [
ifTrue: [aVisitor visitMetaclassDefinition: self].

]

{ #category : '*Monticello' }
MCClassDefinition >> storeDataOn: aDataStream [
| instVarSize |
instVarSize := (self hasTraitComposition or: [ self hasClassTraitComposition ])
ifTrue: [ self class instSize ]
ifFalse: [ self class instSize - 2 ].
aDataStream
beginInstance: self class
size: instVarSize.
1 to: instVarSize do: [ :index |
aDataStream nextPut: (self instVarAt: index) ].
]
Loading