[Pkg] SystemEditor: SystemEditor-Squeak-mtf.155.mcz

squeak-dev-noreply at lists.squeakfoundation.org squeak-dev-noreply at lists.squeakfoundation.org
Fri Nov 7 06:46:43 UTC 2008


A new version of SystemEditor-Squeak was added to project SystemEditor:
http://www.squeaksource.com/SystemEditor/SystemEditor-Squeak-mtf.155.mcz

==================== Summary ====================

Name: SystemEditor-Squeak-mtf.155
Author: mtf
Time: 6 November 2008, 11:46:07 pm
UUID: eaee8787-e69c-4f69-a7cf-20222a44240a
Ancestors: SystemEditor-mtf.154

forked from SystemEditor-mtf.154

=============== Diff against SystemEditor-mtf.154 ===============

Item was added:
+ SystemOrganization addCategory: #'SystemEditor-Squeak'!

Item was removed:
- ----- Method: ClassEditorValidationTest>>test03SameTypeIsValid (in category 'tests') -----
- test03SameTypeIsValid
- 	editor addInstVarName: 'gamma'.
- 	self assert: editor edIsValid !

Item was removed:
- Object subclass: #ObjectMigrator
- 	instanceVariableNames: 'origin destination'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Core'!
- 
- !ObjectMigrator commentStamp: 'mtf 7/14/2008 11:59' prior: 0!
- My instances store an old and new version of a single object that will be swapped during MigrationTransaction>>commit!

Item was removed:
- ----- Method: AbstractEditor>>edIsEditor (in category 'testing') -----
- edIsEditor
- 	^ true!

Item was removed:
- AbstractEditor subclass: #DictionaryEditor
- 	instanceVariableNames: 'subject additions removals'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Core'!

Item was removed:
- ----- Method: ClassFormatTest>>testIndexedWithInstSize (in category 'tests') -----
- testIndexedWithInstSize
- 	| old new |
- 	old := ClassFormat indexed: 3.
- 	new := old withInstSize: 5.
- 	self assert: new instSize = 5.
- 	self assert: new instSpec = old instSpec.
- 	self assert: new cClassIndex = old cClassIndex!

Item was removed:
- ----- Method: MetaclassEditorProtocolTest>>test10SourceCodeAt (in category 'tests') -----
- test10SourceCodeAt
- 	self assert: (editor sourceCodeAt: #ayin) = (editor subject sourceCodeAt: #ayin)!

Item was removed:
- ----- Method: SystemEditorTest>>test13AtIfAbsentEvaluatesBlock (in category 'tests') -----
- test13AtIfAbsentEvaluatesBlock
- 	| object |
- 	object := Object new.
- 	self assert: (editor at: #'Illegal Name' ifAbsent: [object]) == object!

Item was removed:
- ----- Method: ClassEditor class>>forNewClassNamed: (in category '*SystemEditor-Tests') -----
- forNewClassNamed: aSymbol
- 	^ self named: aSymbol for: SystemEditor new!

Item was removed:
- ----- Method: MetaclassEditorProtocolTest>>test08AddAndRemoveSelector (in category 'tests') -----
- test08AddAndRemoveSelector
- 	editor 
- 		compile: 'pe ^ 1'
- 		classified: 'phoenician'
- 		withStamp: 'cwp 5/30/2004 09:27'
- 		notifying: nil
- 		logSource: true.
- 	editor removeSelector: #pe.
- 	self deny: (editor includesSelector: #pe).
- 	!

Item was removed:
- ----- Method: ClassEditorOntologyTest>>test05ClassPool (in category 'tests') -----
- test05ClassPool
- 	"To have DoIts be executed in the right context by a debugger or inspector,
- 	the generated class needs to be adoptable by FakeClassPool."
- 
- 	self 
- 		shouldnt: [FakeClassPool adopt: editor class]
- 		raise: Error.!

Item was removed:
- Object subclass: #ClassDecorator
- 	instanceVariableNames: 'editor'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Core'!
- 
- !ClassDecorator commentStamp: 'mtf 6/19/2008 23:29' prior: 0!
- An abstract superclass for extensions to ClassEditor and MetaclassEditor!

Item was removed:
- CategorizerTest subclass: #CategoryEditorTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: ObjectMigrator class>>origin:destination: (in category 'instance creation') -----
- origin: origin destination: destination 
- 	^ self new setOrigin: origin destination: destination!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test08AddSharedPool (in category 'tests') -----
- test08AddSharedPool
- 	| pool |
- 	pool := Dictionary new.
- 	editor addSharedPool: pool.
- 	self assert: editor sharedPools = (editor subject sharedPools copyWith: pool)!

Item was removed:
- ----- Method: EditorSubjectSubTest>>setUp (in category 'running') -----
- setUp
- 	(Smalltalk at: #EditorSubject)
- 		subclass: #EditorSubjectSub
- 		instanceVariableNames: ''
- 		classVariableNames: ''
- 		poolDictionaries: ''
- 		category: 'SystemEditor-Tests'!

Item was removed:
- TestCase subclass: #EditorSubjectSubTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: SystemEditorTest>>migratedClasses (in category 'asserting') -----
- migratedClasses
- 	| migration |
- 	editor edExpandEditors.
- 	migration := MigrationTransaction new.
- 	editor edPrepareMigration: migration.
- 	^ migration migrators collect: [:ea | ea origin].!

Item was removed:
- ----- Method: SystemEditorTest>>test05ClassEditorsKnowTheirSystemEditors (in category 'tests') -----
- test05ClassEditorsKnowTheirSystemEditors
- 	| first |
- 	first := editor at: #EditorSubject.
- 	self assert: first system == editor!

Item was removed:
- ----- Method: SystemEditorTest>>test03AtCreatesClassEditor (in category 'tests') -----
- test03AtCreatesClassEditor
- 	| classEditor |
- 	classEditor := editor at: #EditorSubject.
- 	self assert: classEditor subject = EditorSubject!

Item was removed:
- ----- Method: TestCategoryEditor>>changedElements (in category 'private') -----
- changedElements
- 	^ changes elementArray!

Item was removed:
- ----- Method: InstanceMigrator>>instances (in category 'accessing') -----
- instances
- 	^ origin allInstances asArray!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test07SharedPools (in category 'tests') -----
- test07SharedPools
- 	self assert: editor sharedPools = editor subject sharedPools!

Item was removed:
- CategorizerEditor subclass: #TestCategoryEditor
- 	instanceVariableNames: 'changes removedElements'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!
- 
- !TestCategoryEditor commentStamp: 'mtf 9/11/2007 12:54' prior: 0!
- A editor for Categorizers. I don't preserve order of changed categories. changes is a categorizer that handles all changes!

Item was removed:
- ----- Method: ClassEditorValidationTest>>test01NoChangeIsValid (in category 'tests') -----
- test01NoChangeIsValid
- 	self assert: editor edIsValid !

Item was removed:
- ----- Method: EditorSubjectSubTest class>>isAbstract (in category 'as yet unclassified') -----
- isAbstract
- 	^ self name == #EditorSubjectSubTest!

Item was removed:
- ----- Method: MetaclassEditorProtocolTest>>test04Superclass (in category 'tests') -----
- test04Superclass
- 	
- 	| result |
- 	editor superclass: self class.
- 	result := editor edBuild.
- 	self deny: result == editor subject.
- 	self assert: result superclass == self class.!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test29InstVarsArentDuplicated (in category 'tests') -----
- test29InstVarsArentDuplicated
- 	editor addInstVarName: 'gamma'.
- 	editor addInstVarName: 'gamma'.
- 	self assert: editor instVarNames = (editor subject instVarNames copyWith: 'gamma')!

Item was removed:
- ----- Method: MethodEditorTest>>test05HasDefaultRepository (in category 'tests') -----
- test05HasDefaultRepository
- 	| editor |
- 	editor := MethodEditor
- 			source: 'one ^ 1'
- 			classified: 'numbers'
- 			stamp: 'cwp 12/11/2005 21:58'
- 			notifying: nil
- 			logging: true.
- 	self assert: editor repository = SourceRepository default!

Item was removed:
- ----- Method: SystemEditorTest>>test19AtDoesntWrapPools (in category 'tests') -----
- test19AtDoesntWrapPools
- 	self assert: (editor at: #Undeclared) == Undeclared!

Item was removed:
- ClassEditorTest subclass: #ClassEditorBuildTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: ObjectMigrator>>destination (in category 'accessing') -----
- destination
- 	^ destination!

Item was removed:
- TestCase subclass: #MetaclassEditorTest
- 	instanceVariableNames: 'editor'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test10Superclass (in category 'tests') -----
- test10Superclass
- 	editor superclass: self class.
- 	self shouldnt: [editor edClassFormat] raise: MessageNotUnderstood.
- 	self assert: editor superclass subject == self class.!

Item was removed:
- ----- Method: MethodEditorTest>>test02LoggingCanBeSupressed (in category 'tests') -----
- test02LoggingCanBeSupressed
- 	| editor actual |
- 	editor := MethodEditor
- 				source: 'one ^ 1'
- 				classified: 'numbers'
- 				stamp: 'cwp 12/11/2005 21:58'
- 				notifying: nil
- 				logging: false.
- 	editor repository: SourceRepository newInternal.
- 	editor compileFrom: nil for: self class.
- 	actual := editor repository changesStream contents.
- 	self assert: actual = 'xxx'!

Item was removed:
- ----- Method: ClassDecorator>>edDependentsDo: (in category 'building') -----
- edDependentsDo: aBlock
- "Find any editors that should be modified because of me, inform them if necessary, then send them to aBlock"!

Item was removed:
- ----- Method: SystemEditorTest>>test11AtIfAbsentFindsExistingEditor (in category 'tests') -----
- test11AtIfAbsentFindsExistingEditor
- 	| object |
- 	object := editor at: #Object.
- 	self assert: (editor at: #Object ifAbsent: [nil]) == object!

Item was removed:
- MetaclassEditorTest subclass: #MetaclassEditorBuildTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- TestCase subclass: #ClassFormatTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: ClassEditorOntologyTest>>test10CompiledMethodAt (in category 'tests') -----
- test10CompiledMethodAt
- 	"Compiled methods are immutable, so we don't wrap them for editing."
- 
- 	self assert: (editor compiledMethodAt: #het) == (editor subject compiledMethodAt: #het)!

Item was removed:
- ----- Method: MetaclassEditorBuildTest>>test05MethodRemoved (in category 'tests') -----
- test05MethodRemoved
- 	
- 	| dict |
- 	editor removeSelector: #ayin.
- 	dict := editor methodDictionary.
- 	self deny: (dict includesKey: #ayin)!

Item was removed:
- ----- Method: InstanceMigrator>>migrateFrom:to: (in category 'migrating') -----
- migrateFrom: oStream to: dStream
- 	self instances do:
- 		[:ea |
- 		oStream nextPut: ea.
- 		dStream nextPut: (self migrate: ea)]!

Item was removed:
- ----- Method: OrganizationEditorTest>>test07BuildWritesCommentToChangesFile (in category 'tests') -----
- test07BuildWritesCommentToChangesFile
- 	| remote repository result |
- 	repository := SourceRepository newInternal.
- 	editor := OrganizationEditor for: (ClassEditor on: self class)
- 				repository: repository.
- 	editor classComment: 'comment string' stamp: 'cwp 12/11/2005 21:58'.
- 	result := editor edBuild.
- 	remote := result commentRemoteStr.
- 	self assertRemoteString: remote inRepository: repository matches: 'comment string'!

Item was removed:
- ----- Method: ClassEditorOntologyTest>>test08Superclass (in category 'tests') -----
- test08Superclass
- 	"#superclass should return an editor on the subject's superclass"
- 
- 	self assert: editor superclass subject == EditorSubject superclass!

Item was removed:
- ----- Method: MethodEditorTest>>test04SourcePointerIsSet (in category 'tests') -----
- test04SourcePointerIsSet
- 	| editor cm |
- 	editor := MethodEditor
- 			source: 'one ^ 1'
- 			classified: 'numbers'
- 			stamp: 'cwp 12/11/2005 21:58'
- 			notifying: nil
- 			logging: true.
- 	editor repository: SourceRepository newInternal.
- 	cm := editor compileFrom: self for: self class.
- 	self assert: cm sourcePointer = 33554517!

Item was removed:
- ----- Method: AbstractEditor>>edPrepareMigration: (in category 'building') -----
- edPrepareMigration: txn
- 	"Adds migrators to the given MigrationTransaction, as necessary to support converting my subject to my product"
- 	self subclassResponsibility!

Item was removed:
- ----- Method: SystemEditorTest>>test12AtIfAbsentCreatesEditorForExistingClass (in category 'tests') -----
- test12AtIfAbsentCreatesEditorForExistingClass
- 	self assert: (editor at: #Object ifAbsent: [nil]) subject == Object!

Item was removed:
- ----- Method: ClassExporterTest>>test01ClassIsAddedToEnvironment (in category 'tests') -----
- test01ClassIsAddedToEnvironment
- 	| class |
- 	class := self createClass.
- 	exporter addClass: class.
- 	exporter commit.
- 	self assert: (Smalltalk at: class name) == class
- 	!

Item was removed:
- ----- Method: TestCategoryEditor>>changesRemoveCategory: (in category 'accessing') -----
- changesRemoveCategory: category
- 	changes removeCategory: category!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test21BeWeak (in category 'tests') -----
- test21BeWeak
- 	editor typeOfClass: #weak.
- 	self assert: editor typeOfClass == #weak.
- 	self assert: editor isWords.
- 	self assert: editor isVariable.
- 	self assert: editor isPointers.
- 	self deny: editor isBits.
- !

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test22BeVariable (in category 'tests') -----
- test22BeVariable
- 	editor typeOfClass: #variable.
- 	self assert: editor typeOfClass == #variable.
- 	self assert: editor isWords.
- 	self assert: editor isVariable.
- 	self assert: editor isPointers.
- 	self deny: editor isWeak.
- 	self deny: editor isBits.
- !

Item was removed:
- ----- Method: MetaclassEditorTest>>setUp (in category 'running') -----
- setUp
- 	editor := (ClassEditor on: EditorSubject) class!

Item was removed:
- ----- Method: SourceRepositoryTest>>test03StoreCommentClassStampedPrior (in category 'tests') -----
- test03StoreCommentClassStampedPrior
- 	| remote |
- 	remote := repository 
- 		storeComment: 'This is a comment.'
- 		forClass: self class
- 		stamped: 'cwp 12/11/2005 21:58'
- 		prior: 42.
- 	self assert: repository changesStream contents = 'xxx
- !!SourceRepositoryTest commentStamp: ''cwp 12/11/2005 21:58'' prior: 42!!
- This is a comment.!!'.
- 
- 	self assert: remote sourceFileNumber = 2.
- 	self assert: remote position = 74!

Item was removed:
- ----- Method: ClassEditorBuildTest>>test10MethodRemoved (in category 'tests') -----
- test10MethodRemoved
- 	
- 	| dict |
- 	editor removeSelector: #het.
- 	dict := editor methodDictionary.
- 	self assert: dict isEmpty!

Item was removed:
- ----- Method: MetaclassEditorTest class>>isAbstract (in category 'as yet unclassified') -----
- isAbstract
- 	^ self name == #MetaclassEditorTest!

Item was removed:
- ----- Method: SystemEditorTest>>test16KeyAtIdentityValueFindEditors (in category 'tests') -----
- test16KeyAtIdentityValueFindEditors
- 	| classEditor |
- 	classEditor := editor at: #Object.
- 	self assert: (editor keyAtIdentityValue: classEditor ifAbsent: [nil]) == #Object!

Item was removed:
- ----- Method: EditorSubject>>het (in category 'phoenician') -----
- het
- 	^ 'first letter of the phoenician alphabet'!

Item was removed:
- ClassEditorTest subclass: #ClassEditorValidationTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: MethodEditorTest>>sourcePointer (in category 'emulating') -----
- sourcePointer
- 	^ 42!

Item was removed:
- ----- Method: CompiledMethod class>>edInstanceBasedOn: (in category '*systemeditor-core') -----
- edInstanceBasedOn: oldInstance
- 
- 	| size |
- 	size := oldInstance endPC - oldInstance initialPC + 1 + oldInstance trailer size.
- 	^ self newMethod: size header: oldInstance header.
- !

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test27Subclass (in category 'tests') -----
- test27Subclass
- 	| sub |
- 	sub := editor
- 			subclass: #EditorSubjectSubclass
- 			instanceVariableNames: ''
- 			classVariableNames: ''
- 			poolDictionaries: ''
- 			category: 'SystemEditor-Tests'.
- 	self assert: sub subject isNil.
- 	self assert: sub name = #EditorSubjectSubclass.
- 	self assert: sub instVarNames isEmpty.
- 	self assert: sub classVarNames isEmpty.
- 	self assert: sub sharedPools isEmpty.!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test38SharedPoolsString (in category 'tests') -----
- test38SharedPoolsString
- 
- 	self assert: editor sharedPoolsString = editor subject sharedPoolsString!

Item was removed:
- Object subclass: #EditorSubject
- 	instanceVariableNames: 'alpha beta'
- 	classVariableNames: 'Beth Aleph'
- 	poolDictionaries: 'EditorSubjectPool'
- 	category: 'SystemEditor-Tests'!
- EditorSubject class
- 	instanceVariableNames: 'omega'!

Item was removed:
- ----- Method: MetaclassEditorBuildTest>>test04ExistingMethods (in category 'tests') -----
- test04ExistingMethods
- 	
- 	| result |
- 	editor compile: 'pe ^ 2'.
- 	result := editor edBuild.
- 	self assert: (result compiledMethodAt: #ayin) == (editor subject compiledMethodAt: #ayin)!

Item was removed:
- ----- Method: ClassEditorValidationTest>>test07InstVarNamedSuper (in category 'tests') -----
- test07InstVarNamedSuper
- 
- 	editor addInstVarName: 'super'.
- 	self should: [editor validate] raise: IllegalVariableName.!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test19BeBytes (in category 'tests') -----
- test19BeBytes
- 	editor typeOfClass: #bytes.
- 	self assert: editor typeOfClass == #bytes.
- 	self assert: editor isBytes.
- 	self assert: editor isBits.
- 	self assert: editor isVariable.
- 	self deny: editor isPointers.!

Item was removed:
- ----- Method: ClassEditorBuildTest>>test17NewMethodsAreClassified (in category 'tests') -----
- test17NewMethodsAreClassified
- 	
- 	| migration organizer |
- 	editor 
- 		compile: 'zayin ^ 2'
- 		classified: 'numbers'
- 		withStamp: 'cwp 5/30/2004 09:27'
- 		notifying: nil
- 		logSource: true.
- 	
- 	migration := MigrationTransaction new.
- 	editor edPrepareMigration: migration.
- 	organizer := migration destinationFor: editor subject organization.
- 	self assert: (organizer categoryOfElement: #zayin) = 'numbers'!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test30ClassVarsArentDuplicated (in category 'tests') -----
- test30ClassVarsArentDuplicated
- 	editor addClassVarName: 'Gimel'.
- 	editor addClassVarName: 'Gimel'.
- 	self assert: editor classVarNames = (editor subject classVarNames copyWith: 'Gimel')!

Item was removed:
- ----- Method: AbstractEditor>>edRequiresBuild (in category 'building') -----
- edRequiresBuild
- "Answer true if this editor needs building; false otherwise"
- 	^ true!

Item was removed:
- SharedPool subclass: #EditorSubjectPool
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: MethodEditorTest>>test01FirstCompilationIsLogged (in category 'tests') -----
- test01FirstCompilationIsLogged
- 	| editor actual expected |
- 	editor := MethodEditor
- 				source: 'one ^ 1'
- 				classified: 'numbers'
- 				stamp: 'cwp 12/11/2005 21:58'
- 				notifying: nil
- 				logging: true.
- 	editor repository: SourceRepository newInternal.
- 	editor compileFrom: nil for: self class.
- 	actual := editor repository changesStream contents.
- 	expected := 'xxx
- !!MethodEditorTest methodsFor: ''numbers'' stamp: ''cwp 12/11/2005 21:58''!!
- one ^ 1!! !!'.
- 	self assert: actual = expected!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test25CompileClassifiedNotifying (in category 'tests') -----
- test25CompileClassifiedNotifying
- 	self deny: (editor includesSelector: #zayin).
- 	editor 
- 		compile: 'zayin ^ 1'
- 		classified: 'numbers'
- 		notifying: nil.
- 	self assert: (editor includesSelector: #zayin)!

Item was removed:
- ----- Method: MetaclassEditorProtocolTest>>test02AddInstVarName (in category 'tests') -----
- test02AddInstVarName
- 	editor addInstVarName: 'psi'.
- 	self assert: editor instVarNames = (editor subject instVarNames copyWith: 'psi')!

Item was removed:
- ----- Method: ObjectMigrator>>migrateFrom:to: (in category 'migrating') -----
- migrateFrom: oStream to: dStream
- 	oStream nextPut: origin.
- 	dStream nextPut: destination.!

Item was removed:
- ----- Method: ClassDecorator>>for: (in category 'initialize-release') -----
- for: anEditor
- 	editor := anEditor!

Item was removed:
- ----- Method: InstanceMigrator>>destination (in category 'accessing') -----
- destination
- 	^ destination!

Item was removed:
- TestCase subclass: #MethodEditorTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: OrganizationEditorTest>>test05SetCommentStamp (in category 'tests') -----
- test05SetCommentStamp
- 	editor := OrganizationEditor for: EditorSubject.
- 	editor classComment: 'comment string' stamp: 'cwp 12/11/2005 21:58'.
- 	self assert: editor commentStamp = 'cwp 12/11/2005 21:58'.!

Item was removed:
- ----- Method: SystemEditorTest>>test02DefaultSubjectIsSmalltalk (in category 'tests') -----
- test02DefaultSubjectIsSmalltalk
- 	self assert: editor subject == Smalltalk!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test02AddInstVarName (in category 'tests') -----
- test02AddInstVarName
- 	editor addInstVarName: 'gamma'.
- 	self assert: editor instVarNames = (editor subject instVarNames copyWith: 'gamma')!

Item was removed:
- ----- Method: MigrationTransaction>>migrators (in category 'accessing') -----
- migrators
- 	^ migrators!

Item was removed:
- ----- Method: OrganizationEditorTest>>test12ReadingCommentDoesntRequireBuild (in category 'tests') -----
- test12ReadingCommentDoesntRequireBuild
- 	editor := OrganizationEditor for: (ClassEditor on: self class).
- 	editor classComment.
- 	self deny: editor edRequiresBuild!

Item was removed:
- ----- Method: EditorSubjectSubTest>>createClass (in category 'support') -----
- createClass
- 	^ self createClassNamed: #EditorSubjectSub2!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test42Comment (in category 'tests') -----
- test42Comment
- 	self assert: (editor comment beginsWith: 'Main comment stating the purpose')!

Item was removed:
- ----- Method: InstanceMigrator class>>from:to: (in category 'as yet unclassified') -----
- from: oldClass to: newClass
- 	^ self new setOrigin: oldClass destination: newClass!

Item was removed:
- ----- Method: AbstractEditor>>productClass (in category 'accessing') -----
- productClass
- "Answers the class of the object that is the result of applying my edits to my subject"
- 
- 	^ self subject class!

Item was removed:
- ----- Method: MigrationTransaction>>initialize (in category 'initialize-release') -----
- initialize
- 	migrators := OrderedCollection new.!

Item was removed:
- ----- Method: MethodEditorTest>>test03RecompilationIsLogged (in category 'tests') -----
- test03RecompilationIsLogged
- 	| editor actual expected |
- 	editor := MethodEditor
- 				source: 'one ^ 1'
- 				classified: 'numbers'
- 				stamp: 'cwp 12/11/2005 21:58'
- 				notifying: nil
- 				logging: true.
- 	editor repository: SourceRepository newInternal.
- 	editor compileFrom: self for: self class.
- 	actual := editor repository changesStream contents.
- 	expected := 'xxx
- !!MethodEditorTest methodsFor: ''numbers'' stamp: ''cwp 12/11/2005 21:58'' prior: 42!!
- one ^ 1!! !!'.
- 	self assert: actual = expected!

Item was removed:
- ----- Method: SystemEditorTest>>denyClassesAreMigrated: (in category 'asserting') -----
- denyClassesAreMigrated: classes 
- 	self deny: (self migratedClasses includesAnyOf: classes)!

Item was removed:
- ----- Method: InstanceMigrator>>migrate: (in category 'migrating') -----
- migrate: oldInstance 
- 	| newInstance |
- 	newInstance := destination edInstanceBasedOn: oldInstance.
- 	1 to: instSize do: 
- 		[:offset | 
- 		(map at: offset) > 0 ifTrue: 
- 			[newInstance 
- 				instVarAt: offset
- 				put: (oldInstance instVarAt: (map at: offset))]].
- 	destination isVariable ifTrue: 
- 		[1 to: oldInstance basicSize do: 
- 			[:offset | newInstance basicAt: offset put: (oldInstance basicAt: offset)]].
- 	^newInstance!

Item was removed:
- ----- Method: SourceRepositoryTest>>test01StoreCommentClassStampedReplacing (in category 'tests') -----
- test01StoreCommentClassStampedReplacing
- 	| remote |
- 	remote := repository 
- 		storeComment: 'This is a comment.'
- 		forClass: self class
- 		stamped: 'cwp 12/11/2005 21:58'
- 		replacing: (RemoteString newFileNumber: 1 position: 42).
- 	self assert: repository changesStream contents = 'xxx
- !!SourceRepositoryTest commentStamp: ''cwp 12/11/2005 21:58'' prior: 16777258!!
- This is a comment.!!'.
- 
- 	self assert: remote sourceFileNumber = 2.
- 	self assert: remote position = 80!

Item was removed:
- SystemOrganization addCategory: #'SystemEditor-Core'!
- SystemOrganization addCategory: #'SystemEditor-Squeak'!
- SystemOrganization addCategory: #'SystemEditor-Tests'!

Item was removed:
- ----- Method: ClassFormatTest>>testNamed (in category 'tests') -----
- testNamed
- 	| format |
- 	format := ClassFormat named: 3.
- 	self assert: format instSize = 3.
- 	self assert: format isFixed.
- 	self assert: format isPointers.
- 	self assert: format isWords.
- 	self deny: format isVariable.
- 	self deny: format isBits.
- 	self deny: format isBytes.
- 	self deny: format isWeak!

Item was removed:
- ----- Method: ClassDecorator>>edBuildInto: (in category 'building') -----
- edBuildInto: aProduct
- "Build what needs to be built, and install it into aProduct"!

Item was removed:
- ----- Method: InstanceMigratorTest>>testMigratingCompiledMethod (in category 'tests') -----
- testMigratingCompiledMethod
- 	| migrator oldInstance newInstance |
- 	migrator := InstanceMigrator from: CompiledMethod to: CompiledMethod.
- 	oldInstance := self class compiledMethodAt: #testMigratingCompiledMethod.
- 	newInstance := migrator migrate: oldInstance.
- 	self assert: newInstance class == CompiledMethod.
- 	self assert: newInstance basicSize = oldInstance basicSize.
- 	self assert: newInstance header = oldInstance header.!

Item was removed:
- TestCase subclass: #SystemEditorTest
- 	instanceVariableNames: 'editor'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: SystemEditorTest>>test06AtDoesntCreateNewClass (in category 'tests') -----
- test06AtDoesntCreateNewClass
- 	self should: [editor at: #EditorSubject2] raise: Error
- 	!

Item was removed:
- ----- Method: SourceRepositoryTest>>test04StoreMethodReplacing (in category 'tests') -----
- test04StoreMethodReplacing
- 	| remote actual expected |
- 	remote := repository 
- 				storeMethod: 'one ^ 1'
- 				forClass: self class
- 				category: 'numbers'
- 				stamped: 'cwp 12/11/2005 21:58'
- 				replacing: (RemoteString newFileNumber: 1 position: 42).
- 	actual := repository changesStream contents.
- 	expected := 'xxx
- !!SourceRepositoryTest methodsFor: ''numbers'' stamp: ''cwp 12/11/2005 21:58'' prior: 16777258!!
- one ^ 1!! !!'.
- 	self assert: actual = expected.
- 	self assert: remote sourceFileNumber = 2.
- 	self assert: remote position = 95!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test18NewFormat (in category 'tests') -----
- test18NewFormat
- 	| superFormat editorFormat |
- 	editor typeOfClass: #variable.
- 	superFormat := ClassFormat fromBits: EditorSubject superclass format.
- 	editorFormat := superFormat indexedSubclass: editor instVarNames size.
- 	self assert: editor format = editorFormat bits!

Item was removed:
- ----- Method: SystemEditorTest>>test01SubjectCanBeSpecified (in category 'tests') -----
- test01SubjectCanBeSpecified
- 	editor := SystemEditor on: Smalltalk.
- 	self assert: editor subject == Smalltalk!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test20BeWords (in category 'tests') -----
- test20BeWords
- 	editor typeOfClass: #words.
- 	self assert: editor typeOfClass == #words.
- 	self assert: editor isWords.
- 	self assert: editor isBits.
- 	self assert: editor isVariable.
- 	self deny: editor isPointers.!

Item was removed:
- ----- Method: ClassEditorOntologyTest>>test01Creation (in category 'tests') -----
- test01Creation
- 	"This invariant allows editors and their subject classes to use
- 	exactly the same reflection protocol, so that the only modification
- 	required to allow tools to modify the system atomically is to send
- 	#commit when all modifications are complete."
- 
- 	self assert: editor subject == EditorSubject.
- 	self assert: editor class subject == EditorSubject class!

Item was removed:
- ----- Method: OrganizationEditorTest>>test10CategoryOfElement (in category 'tests') -----
- test10CategoryOfElement
- 	editor := OrganizationEditor for: (ClassEditor on: self class).
- 	self assert: (editor categoryOfElement: #test10CategoryOfElement) = #tests.!

Item was removed:
- ----- Method: ClassExporterTest>>setUp (in category 'running') -----
- setUp
- 	super setUp.
- 	exporter := ClassExporter on: Smalltalk.
- !

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test41HasComment (in category 'tests') -----
- test41HasComment
- 
- 	self deny: editor hasComment!

Item was removed:
- ----- Method: InstanceMigratorTest>>testTwoClassTransaction (in category 'tests') -----
- testTwoClassTransaction
- 	| mutator classes inst1 inst2 |
- 	mutator := MigrationTransaction new.
- 
- 	classes := self createClassPair.
- 	inst1 := classes key new.
- 	mutator addMigrator: (InstanceMigrator from: classes key to: classes value).
- 
- 	classes := self createClassPair.
- 	inst2 := classes key new.
- 	mutator addMigrator: (InstanceMigrator from: classes key to: classes value).
- 
- 	mutator commit.
- 	self assert: inst1 isInstanceOfNewClass.
- 	self assert: inst2 isInstanceOfNewClass!

Item was removed:
- ----- Method: OrganizationEditorTest>>assertRemoteString:inRepository:matches: (in category 'asserting') -----
- assertRemoteString: remote inRepository: repository matches: aString
- 	self assert: remote sourceFileNumber = 2.
- 	repository changesStream position: remote position.
- 	self assert: (repository changesStream next: aString size) = aString.
- 	repository changesStream next = $!!!

Item was removed:
- ----- Method: ClassEditorOntologyTest>>test09Organization (in category 'tests') -----
- test09Organization
- 
- 	self assert: editor organization subject == editor subject organization!

Item was removed:
- ----- Method: SystemEditorCommitTest>>setUp (in category 'running') -----
- setUp
- 	super setUp.
- 	editor := SystemEditor new.
- !

Item was removed:
- ----- Method: AbstractEditor>>edRegisterEditor (in category 'initialize-release') -----
- edRegisterEditor
- 	"Register myself with my container, which is presumed to be a DictionaryEditor"
- 	self environment edRegisterEditor: self!

Item was removed:
- ----- Method: ClassEditorOntologyTest>>test11MetaOrganization (in category 'tests') -----
- test11MetaOrganization
- 
- 	self assert: editor class organization subject == editor class subject organization!

Item was removed:
- ----- Method: ClassDecorator>>validate (in category 'validating') -----
- validate
- "Raise an error if the build should not proceed"!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test14AddAndRemoveSelector (in category 'tests') -----
- test14AddAndRemoveSelector
- 	editor 
- 		compile: 'zayin ^ 1'
- 		classified: 'numbers'
- 		withStamp: 'cwp 5/30/2004 09:27'
- 		notifying: nil
- 		logSource: true.
- 	editor removeSelector: #zayin.
- 	self deny: (editor includesSelector: #zayin).
- 	!

Item was removed:
- ----- Method: SystemEditorTest>>test14AtIfAbsentDoesntWrapPools (in category 'tests') -----
- test14AtIfAbsentDoesntWrapPools
- 	self assert: (editor at: #Undeclared ifAbsent: [0]) == Undeclared!

Item was removed:
- ----- Method: SystemEditorCommitTest>>test01MigratesInstances (in category 'tests') -----
- test01MigratesInstances
- 	| inst classEditor class |
- 	class := editor subject at: #EditorSubjectSub.
- 	inst := class new.
- 	classEditor := editor at: #EditorSubjectSub.
- 	classEditor addInstVarName: 'gamma'.
- 	editor commit.
- 	self assert: (inst class instVarNames includes: 'gamma')!

Item was removed:
- ----- Method: Behavior>>edInstanceBasedOn: (in category '*systemeditor-core') -----
- edInstanceBasedOn: oldInstance 
- 	| newInstance |
- 	self isVariable 
- 		ifTrue: [newInstance := self basicNew: oldInstance basicSize]
- 		ifFalse: [newInstance := self basicNew].
- 	^newInstance!

Item was removed:
- ----- Method: ClassExporterTest>>test04ClassKnowsItsEnvironment (in category 'tests') -----
- test04ClassKnowsItsEnvironment
- 	| class |
- 	class := self createClass.
- 	exporter addClass: class.
- 	exporter commit.
- 	self assert: class environment == exporter environment
- 	!

Item was removed:
- ----- Method: InstanceMigratorTest>>createClassPair (in category 'support') -----
- createClassPair
- 	| editor oldClass newClass |
- 	editor := ClassEditor on: EditorSubject.
- 	editor compile: 'isInstanceOfNewClass ^ false' classified: 'testing'.
- 	oldClass := editor edBuild.
- 	editor compile: 'isInstanceOfNewClass ^ true' classified: 'testing'.
- 	newClass := editor edBuild.
- 	^ oldClass -> newClass!

Item was removed:
- ----- Method: ClassEditorValidationTest>>test10InstVarNamedFalse (in category 'tests') -----
- test10InstVarNamedFalse
- 
- 	editor addInstVarName: 'false'.
- 	self should: [editor validate] raise: IllegalVariableName.!

Item was removed:
- ----- Method: ClassEditorValidationTest>>test09InstVarNamedTrue (in category 'tests') -----
- test09InstVarNamedTrue
- 
- 	editor addInstVarName: 'true'.
- 	self should: [editor validate] raise: IllegalVariableName.!

Item was removed:
- ----- Method: InstanceMigrator>>createMap (in category 'initialize-release') -----
- createMap
- 	| oldInstVarNames |
- 	oldInstVarNames := origin allInstVarNames.
- 	^ destination allInstVarNames 
- 			collect: [:instVarName | oldInstVarNames indexOf: instVarName].
- !

Item was removed:
- ----- Method: EditorSubject class>>aleph (in category 'accessing class vars') -----
- aleph
- 	^ Aleph !

Item was removed:
- ----- Method: ClassEditorOntologyTest>>test04IsKindOfClass (in category 'tests') -----
- test04IsKindOfClass
- 	"A class and its editor are polymorphic, but this kind of
- 	explicit test can tell the difference."
- 
- 	self deny: (editor class isKindOf: Class)!

Item was removed:
- ----- Method: MetaclassEditorBuildTest>>test02AddInstVar (in category 'tests') -----
- test02AddInstVar
- 	
- 	| result |
- 	editor addInstVarName: 'gamma'.
- 	result := editor edBuild.
- 	self deny: result == editor subject.
- 	self assert: result instVarNames = editor instVarNames.
- 	self assert: result format = editor format.
- !

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test04ClassVarNames (in category 'tests') -----
- test04ClassVarNames
- 	self assert: editor classVarNames = editor subject classVarNames!

Item was removed:
- ----- Method: ClassFormatTest>>testIndexed (in category 'tests') -----
- testIndexed
- 	| format |
- 	format := ClassFormat indexed.
- 	self assert: format instSize = 0.
- 	self assert: format isPointers.
- 	self assert: format isWords.
- 	self assert: format isVariable.
- 	self deny: format isFixed.
- 	self deny: format isBits.
- 	self deny: format isBytes.
- 	self deny: format isWeak
- !

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test12AddSelector (in category 'tests') -----
- test12AddSelector
- 	self deny: (editor includesSelector: #zayin).
- 	editor 
- 		compile: 'zayin ^ 1'
- 		classified: 'numbers'
- 		withStamp: 'cwp 5/30/2004 09:27'
- 		notifying: nil
- 		logSource: true.
- 	self assert: (editor includesSelector: #zayin)!

Item was removed:
- ----- Method: ClassFormatTest>>testIndexedSubclass (in category 'tests') -----
- testIndexedSubclass
- 	| superFormat subFormat |
- 	superFormat := ClassFormat named: 3.
- 	subFormat := superFormat indexedSubclass: 2.
- 	self assert: superFormat instSize = 3.
- 	self assert: subFormat instSize = 5.
- 	self assert: subFormat isVariable.
- 	self assert: subFormat isPointers.
- 	self assert: subFormat isWords.
- 	self deny: subFormat isFixed.
- 	self deny: subFormat isBits.
- 	self deny: subFormat isBytes.
- 	self deny: subFormat isWeak!

Item was removed:
- ----- Method: TestCategoryEditor>>changesRemoveElement: (in category 'accessing') -----
- changesRemoveElement: element
- 	changes removeElement: element!

Item was removed:
- ----- Method: ClassFormatTest>>testNamedSubclass (in category 'tests') -----
- testNamedSubclass
- 	| superFormat subFormat |
- 	superFormat := ClassFormat named: 3.
- 	subFormat := superFormat namedSubclass: 2.
- 	self assert: superFormat instSize = 3.
- 	self assert: subFormat instSize = 5.
- 	self assert: subFormat isFixed.
- 	self assert: subFormat isPointers.
- 	self assert: subFormat isWords.
- 	self deny: subFormat isVariable.
- 	self deny: subFormat isBits.
- 	self deny: subFormat isBytes.
- 	self deny: subFormat isWeak!

Item was removed:
- ----- Method: MetaclassEditorBuildTest>>test01NoChange (in category 'tests') -----
- test01NoChange
- 	"We always rebuild the metaclass, since the class needs to be an instance of it."
- 
- 	self deny: editor edBuild == editor subject.
- 	self deny: editor edRequiresRecompile!

Item was removed:
- ----- Method: ClassExporterTest>>test03ExistingReferencesAreMaintained (in category 'tests') -----
- test03ExistingReferencesAreMaintained
- 	| class reference |
- 	reference := Smalltalk at: #EditorSubjectSub.
- 	class := self createClassNamed: #EditorSubjectSub.
- 	exporter addClass: class.
- 	exporter commit.
- 	self assert: (Smalltalk at: #EditorSubjectSub) == reference.!

Item was removed:
- ----- Method: SystemEditorCommitTest>>test02CategorizesClasses (in category 'tests') -----
- test02CategorizesClasses
- 	| classEditor |
- 	classEditor := editor at: #EditorSubjectSub.
- 	classEditor category: #'SystemEditor-Info'.
- 	editor commit.
- 	self assert: (SystemOrganization categoryOfElement: #EditorSubjectSub) == #'SystemEditor-Info'!

Item was removed:
- ----- Method: OrganizationEditorTest>>test08NilCommentDoesntWriteToChangesFile (in category 'tests') -----
- test08NilCommentDoesntWriteToChangesFile
- 	| repository result |
- 	repository := SourceRepository newInternal.
- 	editor := OrganizationEditor for: (ClassEditor on: self class)
- 				repository: repository.
- 	editor classComment: nil stamp: nil.
- 	result := editor edBuild.
- 	self assert: result commentRemoteStr isNil.
- 	self assert: repository changesStream size = 3!

Item was removed:
- ----- Method: ClassEditorBuildTest>>test02AddInstVar (in category 'tests') -----
- test02AddInstVar
- 	
- 	| result |
- 	editor addInstVarName: 'gamma'.
- 	result := editor product.
- 	self deny: result == editor subject.
- 	self assert: result name = editor subject name.
- 	self assert: result instVarNames = editor instVarNames.
- 	self assert: result format = editor format.
- !

Item was removed:
- ----- Method: SourceRepositoryTest>>test02StoreCommentForClassStamped (in category 'tests') -----
- test02StoreCommentForClassStamped
- 	| remote |
- 	remote := repository 
- 		storeComment: 'This is a comment.'
- 		forClass: self class
- 		stamped: 'cwp 12/11/2005 21:58'.
- 
- 	self assert: repository changesStream contents = 'xxx
- !!SourceRepositoryTest commentStamp: ''cwp 12/11/2005 21:58'' prior: 0!!
- This is a comment.!!'.
- 
- 	self assert: remote sourceFileNumber = 2.
- 	self assert: remote position = 73!

Item was removed:
- ----- Method: EditorSubjectSubTest>>createClassNamed: (in category 'support') -----
- createClassNamed: aSymbol 
- 	| classEditor |
- 	classEditor := (ClassEditor on: EditorSubject) 
- 				subclass: aSymbol
- 				instanceVariableNames: 'gamma'
- 				classVariableNames: ''
- 				poolDictionaries: ''
- 				category: 'SystemEditor-Tests'.
- 	^classEditor product!

Item was removed:
- ----- Method: ClassExporterTest>>test05NewClassReplacesOld (in category 'tests') -----
- test05NewClassReplacesOld
- 	| class |
- 	class := self createClassNamed: #EditorSubjectSub.
- 	exporter addClass: class.
- 	exporter commit.
- 	self assert: ((Smalltalk at: #EditorSubjectSub) instVarNames includes: 'gamma')!

Item was removed:
- ----- Method: MigrationTransaction>>commit (in category 'public') -----
- commit
- 	"The mass become: is a primitive, but we execute this method with preemption
- 	disabled because we don't want another process creating new instances while
- 	we're busy converting the existing instances."
- 
- 	| old new |
- 	[
- 		old := WriteStream on: (Array new: migrators size).
- 		new := WriteStream on: (Array new: migrators size).
- 		migrators do: [:ea | ea migrateFrom: old to: new].
- 		old contents elementsExchangeIdentityWith: new contents.
- 	] valueUnpreemptively.!

Item was removed:
- ----- Method: ClassEditorBuildTest>>test01NoChange (in category 'tests') -----
- test01NoChange
- 	"Since there was no change, we don't have to rebuild the class at all."
- 
- 	| migration |
- 	migration := MigrationTransaction new.
- 	editor edPrepareMigration: migration.
- 	self assert: migration isEmpty!

Item was removed:
- ----- Method: ClassDescriptionEditor>>edIsValid (in category '*SystemEditor-Tests') -----
- edIsValid
- 	[self validate]
- 		on: InvalidSystemChange
- 		do: [:ex | ^ false].
- 	^ true!

Item was removed:
- ----- Method: OrganizationEditorTest>>basicFileStream (in category 'remote string') -----
- basicFileStream
- 	^ stream := WriteStream on: (String new: 20)!

Item was removed:
- ----- Method: ClassEditorValidationTest>>test12InstVarDefinedInSuperclass (in category 'tests') -----
- test12InstVarDefinedInSuperclass
- 
- 	| subeditor |
- 	subeditor := editor
- 				subclass: #EditorSubjectSub
- 				instanceVariableNames: 'alpha'
- 				classVariableNames: ''
- 				poolDictionaries: ''
- 				category: 'Testing'.
- 	self should: [subeditor validate] raise: IllegalVariableName.!

Item was removed:
- ----- Method: SystemEditorTest>>test08DoesntRebuildSubclassesUnnecessarily (in category 'tests') -----
- test08DoesntRebuildSubclassesUnnecessarily
- 	| superclass |
- 	superclass := editor at: #ClassEditorTest.
- 	superclass compile: 'het ^ #one' classified: 'testing'.
- 	self denyClassesAreMigrated: ClassEditorTest subclasses.!

Item was removed:
- ----- Method: ClassEditorBuildTest>>test16CommentNotChanged (in category 'tests') -----
- test16CommentNotChanged
- 	
- 	| migration |
- 	editor comment.
- 
- 	migration := MigrationTransaction new.
- 	editor edPrepareMigration: migration.
- 	self assert: migration migrators isEmpty.!

Item was removed:
- ----- Method: ClassEditorTest>>setUp (in category 'running') -----
- setUp
- 	editor := ClassEditor on: EditorSubject!

Item was removed:
- ----- Method: EditorSubject class>>ayin (in category 'methods for editing') -----
- ayin
- 	^ 22!

Item was removed:
- ----- Method: ClassEditorTest class>>isAbstract (in category 'testing') -----
- isAbstract
- 	^ self name == #ClassEditorTest!

Item was removed:
- ----- Method: OrganizationEditorTest>>test06BuildCopiesCategories (in category 'tests') -----
- test06BuildCopiesCategories
- 	| actual expected |
- 	editor := OrganizationEditor for: (ClassEditor on: self class).
- 	actual := editor edBuild.
- 	expected := self class organization.
- 	self deny: actual == expected.
- 	self assert: actual printString = expected printString!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test15RemoveNewSelector (in category 'tests') -----
- test15RemoveNewSelector
- 	editor removeSelector: #zayin.
- 	self deny: (editor includesSelector: #zayin)!

Item was removed:
- ----- Method: MetaclassEditorProtocolTest>>test09CompiledMethodAt (in category 'tests') -----
- test09CompiledMethodAt
- 	"Compiled methods are immutable, so we don't wrap them for editing."
- 
- 	self assert: (editor compiledMethodAt: #ayin) == (editor subject compiledMethodAt: #ayin)!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test06RemoveClassVarName (in category 'tests') -----
- test06RemoveClassVarName
- 	editor removeClassVarName: 'Beth'.
- 	self assert: editor classVarNames = (editor subject classVarNames copyWithout: 'Beth')!

Item was removed:
- ----- Method: SystemEditorTest>>setUp (in category 'running') -----
- setUp
- 	editor := SystemEditor new.
- !

Item was removed:
- ----- Method: ClassFormatTest>>testWeak (in category 'tests') -----
- testWeak
- 	| format |
- 	format := ClassFormat weak.
- 	self assert: format instSize = 0.
- 	self assert: format isVariable.
- 	self assert: format isPointers.
- 	self assert: format isWords.
- 	self assert: format isWeak.
- 	self deny: format isFixed.
- 	self deny: format isBits.
- 	self deny: format isBytes.
- !

Item was removed:
- ----- Method: ClassEditorBuildTest>>test03Superclass (in category 'tests') -----
- test03Superclass
- 	
- 	| result |
- 	editor superclass: self class.
- 	result := editor product.
- 	self deny: result == editor subject.
- 	self assert: result superclass == self class.!

Item was removed:
- ----- Method: AbstractEditor class>>canEdit: (in category 'as yet unclassified') -----
- canEdit: anObject
- 	^ self canEdit: anObject for: nil!

Item was removed:
- ----- Method: CategoryEditorTest>>setUp (in category 'as yet unclassified') -----
- setUp
- 	super setUp.
- 	categorizer := TestCategoryEditor on: categorizer!

Item was removed:
- ----- Method: AbstractEditor class>>on: (in category 'as yet unclassified') -----
- on: anObject
- 	^ self on: anObject for: nil!

Item was removed:
- ----- Method: MetaclassEditorBuildTest>>test06MethodAdded (in category 'tests') -----
- test06MethodAdded
- 	
- 	| dict |
- 	editor 
- 		compile: 'pe ^ -2'
- 		classified: 'letters'
- 		withStamp: 'cwp 5/30/2004 09:27'
- 		notifying: nil
- 		logSource: true.
- 	dict := editor methodDictionary.
- 	self assert: (dict at: #pe) isCompiledMethod.
- !

Item was removed:
- ----- Method: SystemEditorTest>>test10ValidatesBeforeCommitting (in category 'tests') -----
- test10ValidatesBeforeCommitting
- 	| classEditor |
- 	classEditor := editor at: #EditorSubject.
- 	classEditor typeOfClass: #bytes.
- 	classEditor addInstVarName: 'test'.
- 	self 
- 		should: [editor commit]
- 		raise: InvalidClassFormat!

Item was removed:
- ----- Method: TestCategoryEditor>>changesInCategory: (in category 'accessing') -----
- changesInCategory: category
- 	^ changes listAtCategoryNamed: category!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test26CompileClassified (in category 'tests') -----
- test26CompileClassified
- 	self deny: (editor includesSelector: #zayin).
- 	editor 
- 		compile: 'zayin ^ 1'
- 		classified: 'numbers'.
- 	self assert: (editor includesSelector: #zayin)!

Item was removed:
- ----- Method: ClassDecorator>>edRequiresRecompile (in category 'building') -----
- edRequiresRecompile
- "Answer true if I require my client and all subclasses to be recompiled"
- 	^ false!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test16TypeOfClass (in category 'tests') -----
- test16TypeOfClass
- 	editor typeOfClass = #normal!

Item was removed:
- ----- Method: ClassExporterTest>>test02ClassIsAddedToSuperclass (in category 'tests') -----
- test02ClassIsAddedToSuperclass
- 	| class |
- 	class := self createClass.
- 	exporter addClass: class.
- 	exporter commit.
- 	self assert: (class superclass subclasses includes: class)
- 	!

Item was removed:
- ----- Method: OrganizationEditorTest>>test02ClassComment (in category 'tests') -----
- test02ClassComment
- 	editor := OrganizationEditor for: (ClassEditor on: self class).
- 	self assert: editor classComment asString = 'This comment must be present for the tests to pass.'!

Item was removed:
- ----- Method: ClassEditorOntologyTest>>test03ClassReferences (in category 'tests') -----
- test03ClassReferences
- 
- 	"The instance is a strange beast. Its class is created on the fly, and is
- 	both an instance of MetaclassEditor and a subclass of ClassEditor. 
- 	See #testCreation." 
- 	self assert: editor class class == MetaclassEditor.
- 	self assert: (editor class instVarNamed: 'superclass') == ClassEditor.
- 
- 
- 	"editor is an instance of a light-weight class, so we don't register it
- 	with its superclass. In fact, the only thing that keeps it from being
- 	garbage collected is the class pointer from editor."
- 	self deny: (ClassEditor subclasses includes: editor class).
- 
- !

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test09RemoveSharedPool (in category 'tests') -----
- test09RemoveSharedPool
- 	editor removeSharedPool: EditorSubjectPool.
- 	self assert: editor sharedPools = (editor subject sharedPools copyWithout: EditorSubjectPool)!

Item was removed:
- ----- Method: ClassEditorValidationTest>>test11InstVarNamedNil (in category 'tests') -----
- test11InstVarNamedNil
- 
- 	editor addInstVarName: 'nil'.
- 	self should: [editor validate] raise: IllegalVariableName.!

Item was removed:
- ----- Method: MigrationTransaction>>isEmpty (in category 'public') -----
- isEmpty
- 	^ migrators isEmpty!

Item was removed:
- ----- Method: ClassDecorator class>>for: (in category 'as yet unclassified') -----
- for: anEditor
- 	"Answer a decorator appropriate for anEditor, or nil if not applicable"
- 	^ self new for: anEditor!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test13RemoveSelector (in category 'tests') -----
- test13RemoveSelector
- 	editor removeSelector: #het.
- 	self deny: (editor includesSelector: #het)!

Item was removed:
- ----- Method: OrganizationEditorTest>>test01SubjectCanBeSpecified (in category 'tests') -----
- test01SubjectCanBeSpecified
- 	editor := OrganizationEditor for: (ClassEditor on: EditorSubject).
- 	self assert: editor subject == EditorSubject organization!

Item was removed:
- ----- Method: OrganizationEditorTest>>test03CommentStamp (in category 'tests') -----
- test03CommentStamp
- 	editor := OrganizationEditor for: (ClassEditor on: self class).
- 	self assert: editor commentStamp = OrganizationEditorTest organization commentStamp!

Item was removed:
- ----- Method: InstanceMigratorTest>>testOneClassTransaction (in category 'tests') -----
- testOneClassTransaction
- 	| mutator classes inst |
- 	classes := self createClassPair.
- 	inst := classes key new.
- 	mutator := MigrationTransaction new.
- 	mutator addMigrator: (InstanceMigrator from: classes key to: classes value).
- 	mutator commit.
- 	self assert: inst isInstanceOfNewClass!

Item was removed:
- ----- Method: MetaclassEditorProtocolTest>>test07RemoveSelector (in category 'tests') -----
- test07RemoveSelector
- 	editor removeSelector: #ayin.
- 	self deny: (editor includesSelector: #ayin)!

Item was removed:
- ----- Method: SystemEditorTest>>test04ClassEditorsAreCached (in category 'tests') -----
- test04ClassEditorsAreCached
- 	| first second |
- 	first := editor at: #EditorSubject.
- 	second := editor at: #EditorSubject.
- 	self assert: first == second!

Item was removed:
- ----- Method: ClassEditorBuildTest>>test05RemoveClassVar (in category 'tests') -----
- test05RemoveClassVar
- 	
- 	| result |
- 	editor removeClassVarName: 'Beth'.
- 	result := editor product.
- 	self deny: result == editor subject.
- 	self assert: result classVarNames = editor classVarNames.!

Item was removed:
- ----- Method: ClassEditorOntologyTest>>test02Printing (in category 'tests') -----
- test02Printing
- 	"This makes debugging easier."
- 	
- 	self assert: editor printString = 'a ClassEditor on: EditorSubject'.
- 	self assert: editor class printString = 'a MetaclassEditor on: EditorSubject'.!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test39Category (in category 'tests') -----
- test39Category
- 
- 	self assert: editor category = editor subject category!

Item was removed:
- ----- Method: ClassFormatTest>>testWords (in category 'tests') -----
- testWords
- 	| format |
- 	format := ClassFormat words.
- 	self assert: format instSize = 0.
- 	self assert: format isVariable.
- 	self assert: format isBits.
- 	self assert: format isWords.
- 	self deny: format isFixed.
- 	self deny: format isPointers.
- 	self deny: format isBytes.
- 	self deny: format isWeak
- !

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test31AllInstVarNames (in category 'tests') -----
- test31AllInstVarNames
- 	
- 	| subeditor |
- 	editor addInstVarName: 'gamma'.
- 	subeditor := ClassEditor forNewClassNamed: #EditorSubjectSub.
- 	subeditor superclass: editor.
- 	subeditor addInstVarName: 'delta'.
- 	self assert: subeditor allInstVarNames = (editor subject instVarNames, #('gamma' 'delta')).
- 
- !

Item was removed:
- ----- Method: AbstractEditor class>>on:ifNotHandled: (in category 'as yet unclassified') -----
- on: subject ifNotHandled: aBlock
- 	^ self on: subject for: nil ifNotHandled: aBlock!

Item was removed:
- EditorSubjectSubTest subclass: #ClassExporterTest
- 	instanceVariableNames: 'exporter'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: EditorSubjectSubTest>>tearDown (in category 'running') -----
- tearDown
- 	(Smalltalk at: #EditorSubject)
- 		allSubclasses do: [:ea | ea removeFromSystem]!

Item was removed:
- ----- Method: MetaclassEditorBuildTest>>test07MethodRecompilation (in category 'tests') -----
- test07MethodRecompilation
- 	
- 	| dict |
- 	editor addInstVarName: 'psi'.
- 	dict := editor methodDictionary.
- 	self deny: (dict at: #ayin) == (editor subject compiledMethodAt: #ayin).
- !

Item was removed:
- ----- Method: ClassFormatTest>>testNoState (in category 'tests') -----
- testNoState
- 	| format |
- 	format := ClassFormat noState.
- 	self assert: format instSize = 0.
- 	self assert: format isFixed.
- 	self assert: format isPointers.
- 	self assert: format isWords.
- 	self deny: format isVariable.
- 	self deny: format isBits.
- 	self deny: format isBytes.
- 	self deny: format isWeak!

Item was removed:
- ----- Method: ClassFormatTest>>testBytes (in category 'tests') -----
- testBytes
- 	| format |
- 	format := ClassFormat bytes.
- 	self assert: format instSize = 0.
- 	self assert: format isVariable.
- 	self assert: format isBits.
- 	self assert: format isBytes.
- 	self deny: format isFixed.
- 	self deny: format isPointers.
- 	self deny: format isWords.
- 	self deny: format isWeak
- !

Item was removed:
- ----- Method: AbstractEditor class>>canEdit:for: (in category 'as yet unclassified') -----
- canEdit: anObject for: containerEditor
- 	^ false!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test35IsBehavior (in category 'tests') -----
- test35IsBehavior
- 
- 	self assert: editor isBehavior!

Item was removed:
- ----- Method: ClassEditorValidationTest>>test06InstVarNamedSelf (in category 'tests') -----
- test06InstVarNamedSelf
- 
- 	editor addInstVarName: 'self'.
- 	self should: [editor validate] raise: IllegalVariableName.!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test34Subclasses (in category 'tests') -----
- test34Subclasses
- 
- 	| supereditor |
- 	supereditor := (editor system at: #Object)
- 					subclass: #EditorSubjectSuper 
- 					instanceVariableNames: ''
- 					classVariableNames: ''
- 					poolDictionaries: ''
- 					category: 'Testing'.
- 	editor superclass: supereditor.
- 	self assert: supereditor subclasses = (Array with: editor)!

Item was removed:
- ----- Method: SystemEditorTest>>test07ReshapesSubclasses (in category 'tests') -----
- test07ReshapesSubclasses
- 	| superclass |
- 	superclass := editor at: #ClassEditorTest.
- 	superclass addInstVarName: 'gamma'.
- 	self assertClassesAreMigrated: ClassEditorTest subclasses!

Item was removed:
- ClassEditorTest subclass: #ClassEditorProtocolTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: MetaclassEditorBuildTest>>test09NoSubject (in category 'tests') -----
- test09NoSubject
- 	
- 	| result |
- 	editor := (ClassEditor forNewClassNamed: #EditorSubect2) class.
- 	result := editor edBuild.
- 	self assert: result isMeta!

Item was removed:
- ----- Method: ClassDecorator>>edBuild (in category 'building') -----
- edBuild
- "Build what needs to be built, but don't install it"!

Item was removed:
- ----- Method: SourceRepositoryTest>>setUp (in category 'running') -----
- setUp
- 	repository := SourceRepository newInternal!

Item was removed:
- ----- Method: TestCategoryEditor>>classifyChange:under:suppressIfDefault: (in category 'accessing') -----
- classifyChange: element under: category suppressIfDefault: aBoolean
- 	changes classify: element under: category suppressIfDefault: aBoolean!

Item was removed:
- ----- Method: SystemEditorTest>>test15KeyAtIdentityValueFindPools (in category 'tests') -----
- test15KeyAtIdentityValueFindPools
- 	self assert: (editor keyAtIdentityValue: Undeclared ifAbsent: [nil]) = #Undeclared!

Item was removed:
- ----- Method: OrganizationEditorTest>>sourceFileNumber (in category 'remote string') -----
- sourceFileNumber
- 	^ 2!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test03RemoveClassVarName (in category 'tests') -----
- test03RemoveClassVarName
- 	editor removeClassVarName: 'Beth'.
- 	self assert: editor classVarNames = (editor subject classVarNames copyWithout: 'Beth')!

Item was removed:
- ----- Method: OrganizationEditorTest>>repository (in category 'construction') -----
- repository
- 	self shouldBeImplemented!

Item was removed:
- ----- Method: ClassEditorBuildTest>>test15CommentChanged (in category 'tests') -----
- test15CommentChanged
- 	
- 	| migration |
- 	editor classComment: 'A new comment' stamp: 'cwp 12/18/2005 15:47'.
- 
- 	migration := MigrationTransaction new.
- 	editor edPrepareMigration: migration.
- 	self assert: migration migrators size = 1.
- 	self assert: (migration migrators first origin isKindOf: ClassOrganizer)!

Item was removed:
- TestCase subclass: #InstanceMigratorTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: OrganizationEditorTest>>setUp (in category 'running') -----
- setUp
- 	editor := OrganizationEditor for: EditorSubject!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test32FormatWithEditedSuperclass (in category 'tests') -----
- test32FormatWithEditedSuperclass
- 
- 	| format supereditor |
- 	supereditor := (editor system at: #Object)
- 					subclass: #EditorSubjectSub 
- 					instanceVariableNames: 'gamma'
- 					classVariableNames: ''
- 					poolDictionaries: ''
- 					category: 'Testing'.
- 	editor superclass: supereditor.
- 	format := ClassFormat fromBits: editor format.
- 	self assert: format instSize = (supereditor instSize + editor instVarNames size)!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test28InstSize (in category 'tests') -----
- test28InstSize
- 	| sub |
- 	sub := editor
- 			subclass: #EditorSubjectSubclass
- 			instanceVariableNames: 'gamma'
- 			classVariableNames: ''
- 			poolDictionaries: ''
- 			category: 'SystemEditor-Tests'.
- 	self assert: sub instSize = 3!

Item was removed:
- ----- Method: DictionaryEditor>>isChanged (in category 'testing') -----
- isChanged
- 	^ additions notEmpty or: [removals notEmpty]!

Item was removed:
- ----- Method: ClassDecorator>>edPostLoad (in category 'building') -----
- edPostLoad
- "Do something after the migration is finished"!

Item was removed:
- ----- Method: SystemEditorTest>>test09RecompilesSubclasses (in category 'tests') -----
- test09RecompilesSubclasses
- 	"This test isn't quite right. It should actually compare compiled methods."
- 
- 	| superclass |
- 	superclass := editor at: #ClassEditorTest.
- 	superclass removeInstVarName: 'alpha'.
- 	self assertClassesAreMigrated: ClassEditorTest subclasses!

Item was removed:
- ----- Method: ClassDecorator>>edRequiresBuild (in category 'building') -----
- edRequiresBuild
- "Answer true if I need my client to be built afresh"
- 	^ false!

Item was removed:
- ----- Method: ClassEditorValidationTest>>test04TooManyInstVars (in category 'tests') -----
- test04TooManyInstVars
- 	1 to: 255 do: [:i | editor addInstVarName: i asString].
- 	self should: [editor validate] raise: InvalidClassFormat!

Item was removed:
- ----- Method: ClassFormatTest>>testNamedWithInstSize (in category 'tests') -----
- testNamedWithInstSize
- 	| old new |
- 	old := ClassFormat named: 3.
- 	new := old withInstSize: 5.
- 	self assert: new instSize = 5.
- 	self assert: new instSpec = old instSpec.
- 	self assert: new cClassIndex = old cClassIndex!

Item was removed:
- ----- Method: ClassEditorValidationTest>>test05MultiplyDefinedInstVars (in category 'tests') -----
- test05MultiplyDefinedInstVars
- 	"See ClassEditorProtocolTest>>test29InstVarsArentDuplicated"
- 
- 	editor
- 		addInstVarName: 'gamma';
- 		addInstVarName: 'gamma'.
- 	self assert: editor edIsValid!

Item was removed:
- ----- Method: SystemEditorTest>>test18RemovedClassesArentPresent (in category 'tests') -----
- test18RemovedClassesArentPresent
- 	| classEditor |
- 	classEditor := editor at: #EditorSubject.
- 	classEditor removeFromSystem.
- 	self should: [editor at: #EditorSubject] raise: Error.!

Item was removed:
- ----- Method: CategoryEditorTest>>tearDown (in category 'as yet unclassified') -----
- tearDown
- 	self assert: categorizer subject printString =
- '(''as yet unclassified'' d e)
- (''abc'' a b c)
- (''unreal'')
- '!

Item was removed:
- EditorSubjectSubTest subclass: #SystemEditorCommitTest
- 	instanceVariableNames: 'editor'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: EditorSubject class>>aleph: (in category 'accessing class vars') -----
- aleph: anObject
- 	Aleph := anObject!

Item was removed:
- ----- Method: TestCategoryEditor>>changesAddCategory:before: (in category 'accessing') -----
- changesAddCategory: newCategory before: nextCategory
- 	"I don't support ordering"
- 	changes addCategory: newCategory!

Item was removed:
- ----- Method: InstanceMigrator>>setOrigin:destination: (in category 'initialize-release') -----
- setOrigin: oldClass destination: newClass
- 	origin := oldClass.
- 	destination := newClass.
- 	map := self createMap.
- 	instSize := destination instSize!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test05AddClassVarName (in category 'tests') -----
- test05AddClassVarName
- 	editor addClassVarName: #Gimel.
- 	self assert: editor classVarNames = (editor subject classVarNames copyWith: #Gimel)!

Item was removed:
- ----- Method: ClassEditorValidationTest>>test13InstVarDefinedInSubclass (in category 'tests') -----
- test13InstVarDefinedInSubclass
- 
- 	editor
- 		subclass: #EditorSubjectSub
- 		instanceVariableNames: 'gamma'
- 		classVariableNames: ''
- 		poolDictionaries: ''
- 		category: 'Testing'.
- 	editor addInstVarName: 'gamma'.
- 	self should: [editor validate] raise: IllegalVariableName.!

Item was removed:
- ----- Method: SystemEditorTest>>test17RemovedClassesAreAbsent (in category 'tests') -----
- test17RemovedClassesAreAbsent
- 	| classEditor |
- 	classEditor := editor at: #EditorSubject.
- 	classEditor removeFromSystem.
- 	self assert: (editor at: #EditorSubject ifAbsent: [nil]) isNil!

Item was removed:
- ----- Method: ClassEditorBuildTest>>test07AddSharedPool (in category 'tests') -----
- test07AddSharedPool
- 	
- 	| result pool |
- 	pool := Dictionary new.
- 	editor addSharedPool: pool.
- 	result := editor product.
- 	self deny: result == editor subject.
- 	self assert: (result sharedPools includes: pool).
- 	self deny: (editor subject sharedPools includes: pool).!

Item was removed:
- TestCase subclass: #SourceRepositoryTest
- 	instanceVariableNames: 'repository'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: ClassEditorBuildTest>>test04AddClassVar (in category 'tests') -----
- test04AddClassVar
- 	
- 	| result |
- 	editor addClassVarName: 'Gimel'.
- 	result := editor product.
- 	self deny: result == editor subject.
- 	self assert: result classVarNames = editor classVarNames.
- !

Item was removed:
- ----- Method: TestCategoryEditor class>>on: (in category 'as yet unclassified') -----
- on: aCategorizer
- 	^ self new setSubject: aCategorizer!

Item was removed:
- ----- Method: ClassEditorBuildTest>>test14SuperclassEditedInstVars (in category 'tests') -----
- test14SuperclassEditedInstVars
- 	
- 	| result subeditor |
- 	editor addInstVarName: 'gamma'.
- 	subeditor := ClassEditor forNewClassNamed: #EditorSubjectSub.
- 	subeditor superclass: editor.
- 	subeditor addInstVarName: 'delta'.
- 	result := subeditor product.
- 	self assert: result allInstVarNames = (editor subject instVarNames, #('gamma' 'delta')).
- 
- !

Item was removed:
- ----- Method: OrganizationEditorTest>>test11RemovingCommentCausesBuild (in category 'tests') -----
- test11RemovingCommentCausesBuild
- 	| repository |
- 	repository := SourceRepository newInternal.
- 	editor := OrganizationEditor for: (ClassEditor on: self class)
- 				repository: repository.
- 	editor classComment: nil stamp: nil.
- 	self assert: editor edRequiresBuild!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test33InstSizeWithEditedSuperclass (in category 'tests') -----
- test33InstSizeWithEditedSuperclass
- 
- 	| supereditor |
- 	supereditor := (editor system at: #Object)
- 					subclass: #EditorSubjectSub 
- 					instanceVariableNames: 'gamma'
- 					classVariableNames: ''
- 					poolDictionaries: ''
- 					category: 'Testing'.
- 	editor superclass: supereditor.
- 	self assert: editor instSize = (supereditor instSize + editor instVarNames size)!

Item was removed:
- ----- Method: MigrationTransaction>>addMigrator: (in category 'public') -----
- addMigrator: aMigrator
- 	migrators add: aMigrator!

Item was removed:
- ----- Method: MetaclassEditorBuildTest>>test03Superclass (in category 'tests') -----
- test03Superclass
- 	
- 	| result |
- 	editor superclass: self class class.
- 	result := editor edBuild.
- 	self deny: result == editor subject.
- 	self assert: result superclass == self class class.!

Item was removed:
- Object subclass: #AbstractEditor
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Core'!

Item was removed:
- ----- Method: SystemEditorCommitTest>>test03RemovesClasses (in category 'tests') -----
- test03RemovesClasses
- 	| classEditor |
- 	classEditor := editor at: #EditorSubjectSub.
- 	classEditor removeFromSystem.
- 	editor commit.
- 	self deny: (Smalltalk hasClassNamed: #EditorSubjectSub)!

Item was removed:
- ----- Method: MetaclassEditorProtocolTest>>test06RemoveNewSelector (in category 'tests') -----
- test06RemoveNewSelector
- 	editor removeSelector: #pe.
- 	self deny: (editor includesSelector: #pe)!

Item was removed:
- ----- Method: OrganizationEditorTest>>position (in category 'remote string') -----
- position
- 	^ 42!

Item was removed:
- Object subclass: #InstanceMigrator
- 	instanceVariableNames: 'map instSize origin destination'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Core'!
- 
- !InstanceMigrator commentStamp: 'mtf 7/14/2008 23:51' prior: 0!
- My instances are responsible for finding instances of an old class and building them in a new format, to be swapped during MigrationTransaction>>commit!

Item was removed:
- ----- Method: TestCategoryEditor>>removedElements (in category 'private') -----
- removedElements
- 	^ removedElements !

Item was removed:
- ----- Method: ClassFormatTest>>testBitsWithInstSize (in category 'tests') -----
- testBitsWithInstSize
- 	| format |
- 	format := ClassFormat bytes.
- 	self should: [format withInstSize: 2] raise: InvalidClassFormat!

Item was removed:
- ClassEditorTest subclass: #ClassEditorOntologyTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: MetaclassEditorProtocolTest>>test01InstVarNames (in category 'tests') -----
- test01InstVarNames
- 	self assert: editor instVarNames = editor subject instVarNames!

Item was removed:
- ----- Method: AbstractEditor class>>on:for:ifNotHandled: (in category 'as yet unclassified') -----
- on: subject for: collectionEditor ifNotHandled: aBlock
- 	"Try to find the most specialized subclass willing to edit,  for extensibility"
- 	| editor |
- 	"nil subject is always permitted; it means new object"
- 	subject ifNil: [^ self new on: subject for: collectionEditor].
- 	self subclassesDo: [:class |
- 		editor := class on: subject for: collectionEditor ifNotHandled: [nil].
- 		editor ifNotNil: [^ editor]].
- 	(self canEdit: subject for: collectionEditor)
- 		ifTrue: [^ self new on: subject for: collectionEditor].
- 	^ aBlock value!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test44SourceCodeAt (in category 'tests') -----
- test44SourceCodeAt
- 	self assert: (editor sourceCodeAt: #het) = (editor subject sourceCodeAt: #het)!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test36InstanceVariablesString (in category 'tests') -----
- test36InstanceVariablesString
- 
- 	self assert: editor instanceVariablesString = editor subject instanceVariablesString!

Item was removed:
- ----- Method: InstanceMigrator>>origin (in category 'accessing') -----
- origin
- 	^ origin!

Item was removed:
- ----- Method: AbstractEditor>>subject (in category 'accessing') -----
- subject
- "Answers the object I am editing"
- 
- 	self subclassResponsibility!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test43SetClassComment (in category 'tests') -----
- test43SetClassComment
- 	editor classComment: 'class comment' stamp: 'cwp 12/11/2005 22:00'.
- 	editor comment = 'class comment'!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test17Format (in category 'tests') -----
- test17Format
- 
- 	| format |
- 	format := ClassFormat fromBits: editor format.
- 	self assert: format instSize = editor subject instSize.
- 	self assert: format instSpec = editor subject instSpec.
- 	self assert: format isBits = editor subject isBits.
- 	self assert: format isBytes = editor subject isBytes.
- 	self assert: format isFixed = editor subject isFixed.
- 	self assert: format isPointers = editor subject isPointers.
- 	self assert: format isVariable = editor subject isVariable.
- 	self assert: format isWeak = editor subject isWeak.
- 	self assert: format isWords = editor subject isWords.!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test40SetCategory (in category 'tests') -----
- test40SetCategory
- 
- 	editor category: #'Test-Category'.
- 	self assert: editor category = #'Test-Category'!

Item was removed:
- TestCase subclass: #OrganizationEditorTest
- 	instanceVariableNames: 'editor stream'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!
- 
- !OrganizationEditorTest commentStamp: 'cwp 12/18/2005 15:47' prior: 0!
- This comment must be present for the tests to pass.!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test01InstVarNames (in category 'tests') -----
- test01InstVarNames
- 	self assert: editor instVarNames = editor subject instVarNames!

Item was removed:
- ----- Method: ObjectMigrator>>setOrigin:destination: (in category 'initialize-release') -----
- setOrigin: anObject1 destination: anObject2 
- 	origin := anObject1.
- 	destination := anObject2!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test11ClassVarNamesInterned (in category 'tests') -----
- test11ClassVarNamesInterned
- 	editor addClassVarName: 'Gimel'.
- 	self assert: (editor classVarNames anySatisfy: [:ea | ea == #Gimel])!

Item was removed:
- ----- Method: ClassFormatTest>>testNamedAndIndexed (in category 'tests') -----
- testNamedAndIndexed
- 	| format |
- 	format := ClassFormat indexed: 3.
- 	self assert: format instSize = 3.
- 	self assert: format isPointers.
- 	self assert: format isWords.
- 	self assert: format isVariable.
- 	self deny: format isFixed.
- 	self deny: format isBits.
- 	self deny: format isBytes.
- 	self deny: format isWeak
- !

Item was removed:
- ----- Method: ClassFormatTest>>testNoStateSubclass (in category 'tests') -----
- testNoStateSubclass
- 	| format superformat |
- 	superformat := ClassFormat noState.
- 	format := superformat namedSubclass: 0.
- 	self assert: format instSize = 0.
- 	self assert: format isFixed.
- 	self assert: format isPointers.
- 	self assert: format isWords.
- 	self deny: format isVariable.
- 	self deny: format isBits.
- 	self deny: format isBytes.
- 	self deny: format isWeak.
- 	self assert: superformat bits == format bits!

Item was removed:
- ----- Method: MigrationTransaction>>destinationFor: (in category 'accessing') -----
- destinationFor: anObject
- 	migrators do: [:ea | ea origin = anObject ifTrue: [^ ea destination]].
- 	^ nil!

Item was removed:
- ----- Method: ClassDescriptionEditor>>methodDictionary (in category '*SystemEditor-Tests') -----
- methodDictionary
- 	| methodEditor |
- 	(methods isNil and: [self edRequiresRecompile not]) ifTrue: [^ self subject methodDictionary].
- 	methodEditor := methods ifNil: [MethodDictionaryEditor for: self].
- 	^ methodEditor buildFor: self!

Item was removed:
- ----- Method: TestCategoryEditor>>changesRenameCategory:toBe: (in category 'accessing') -----
- changesRenameCategory: oldCategory toBe: newCategory
- 	changes renameCategory: oldCategory toBe: newCategory!

Item was removed:
- ----- Method: ClassEditorValidationTest>>test02BitsWithVariablesIsInvalid (in category 'tests') -----
- test02BitsWithVariablesIsInvalid
- 	editor typeOfClass: #bytes.
- 	self should: [editor validate] raise: InvalidClassFormat!

Item was removed:
- ----- Method: TestCategoryEditor>>categoryOfChange: (in category 'accessing') -----
- categoryOfChange: element
- 	^ changes categoryOfElement: element!

Item was removed:
- TestCase subclass: #ClassEditorTest
- 	instanceVariableNames: 'editor'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test23BeNormal (in category 'tests') -----
- test23BeNormal
- 	editor typeOfClass: #normal.
- 	self assert: editor typeOfClass == #normal.
- 	self assert: editor isPointers.
- 	self deny: editor isWords.
- 	self deny: editor isVariable.
- 	self deny: editor isWeak.
- 	self deny: editor isBits.
- !

Item was removed:
- ----- Method: MetaclassEditorProtocolTest>>test03RemoveInstVarName (in category 'tests') -----
- test03RemoveInstVarName
- 	editor removeInstVarName: 'omega'.
- 	self assert: editor instVarNames = (editor subject instVarNames copyWithout: 'omega')!

Item was removed:
- MetaclassEditorTest subclass: #MetaclassEditorProtocolTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Tests'!

Item was removed:
- ----- Method: ClassEditorValidationTest>>test08InstVarNamedThisContext (in category 'tests') -----
- test08InstVarNamedThisContext
- 
- 	editor addInstVarName: 'thisContext'.
- 	self should: [editor validate] raise: IllegalVariableName.!

Item was removed:
- ----- Method: SystemEditorTest>>assertClassesAreMigrated: (in category 'asserting') -----
- assertClassesAreMigrated: classes 
- 	self assert: (self migratedClasses includesAllOf: classes)!

Item was removed:
- ----- Method: ClassDecorator>>edPrepareMigration: (in category 'building') -----
- edPrepareMigration: txn
- "Prepare a migration, if necessary"!

Item was removed:
- ----- Method: OrganizationEditorTest>>test09EmptyCommentWrittenToChangesFile (in category 'tests') -----
- test09EmptyCommentWrittenToChangesFile
- 	| remote repository result |
- 	repository := SourceRepository newInternal.
- 	editor := OrganizationEditor for: (ClassEditor on: self class)
- 				repository: repository.
- 	editor classComment: '' stamp: 'cwp 12/11/2005 21:58'.
- 	result := editor edBuild.
- 	remote := result commentRemoteStr.
- 	self assertRemoteString: remote inRepository: repository matches: ''!

Item was removed:
- ----- Method: ClassEditorBuildTest>>test12MethodRecompilation (in category 'tests') -----
- test12MethodRecompilation
- 	
- 	| dict |
- 	editor addInstVarName: 'gamma'.
- 	dict := editor methodDictionary.
- 	self deny: (dict at: #het) == (editor subject compiledMethodAt: #het).
- !

Item was removed:
- ----- Method: TestCategoryEditor>>setSubject: (in category 'initialize-release') -----
- setSubject: aCategorizer
- 	super setSubject: aCategorizer.
- 	changes := Categorizer defaultList: Array new.
- 	removedElements := Set new!

Item was removed:
- ----- Method: OrganizationEditorTest>>test04SetComment (in category 'tests') -----
- test04SetComment
- 	editor := OrganizationEditor for: EditorSubject.
- 	editor classComment: 'comment string' stamp: 'cwp 12/11/2005 21:58'.
- 	self assert: editor classComment = 'comment string'!

Item was removed:
- ----- Method: AbstractEditor class>>named:for: (in category 'as yet unclassified') -----
- named: aName for: aDictionaryEditor
- 	"Answers a new or existing instance with the given name, and installs it, if necessary"
- 	^ aDictionaryEditor at: aName ifAbsent: [
- 		(self on: nil for: aDictionaryEditor)
- 			setName: aName;
- 			edRegisterEditor;
- 			yourself]!

Item was removed:
- Object subclass: #MigrationTransaction
- 	instanceVariableNames: 'migrators'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'SystemEditor-Core'!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test24CompileClassifiedWithStampNotifying (in category 'tests') -----
- test24CompileClassifiedWithStampNotifying
- 	self deny: (editor includesSelector: #zayin).
- 	editor 
- 		compile: 'zayin ^ 1'
- 		classified: 'numbers'
- 		withStamp: 'cwp 5/30/2004 09:27'
- 		notifying: nil.
- 	self assert: (editor includesSelector: #zayin)!

Item was removed:
- ----- Method: ClassEditorBuildTest>>test09ExistingMethods (in category 'tests') -----
- test09ExistingMethods
- 	
- 	| result |
- 	editor compile: 'waw ^ 3' classified: 'phoenician'.
- 	result := editor product.
- 	self assert: (result compiledMethodAt: #het) == (editor subject compiledMethodAt: #het)!

Item was removed:
- ----- Method: MetaclassEditorProtocolTest>>test05AddSelector (in category 'tests') -----
- test05AddSelector
- 	self deny: (editor includesSelector: #zayin).
- 	editor 
- 		compile: 'zayin ^ 1'
- 		classified: 'numbers'
- 		withStamp: 'cwp 5/30/2004 09:27'
- 		notifying: nil
- 		logSource: true.
- 	self assert: (editor includesSelector: #zayin)!

Item was removed:
- ----- Method: ClassEditorBuildTest>>test08RemoveSharedPool (in category 'tests') -----
- test08RemoveSharedPool
- 	
- 	| result |
- 	editor removeSharedPool: EditorSubjectPool.
- 	result := editor product.
- 	self deny: result == editor subject.
- 	self deny: (result sharedPools includes: EditorSubjectPool).
- 	self assert: (editor subject sharedPools includes: EditorSubjectPool).!

Item was removed:
- ----- Method: ClassEditorOntologyTest>>test06Format (in category 'tests') -----
- test06Format
- 	"Despite having an instance variable called 'format' 
- 	MetaclassEditors should answer the format of the 
- 	subject's metaclass, not the format of ClassEditor class."
- 
- 	self assert: editor class format = EditorSubject class format!

Item was removed:
- ----- Method: ClassEditorBuildTest>>test06PreserveClassVar (in category 'tests') -----
- test06PreserveClassVar
- 	
- 	| result object |
- 	object := Object new.
- 	editor removeClassVarName: 'Beth'.
- 	editor subject aleph: object.
- 	result := editor product.
- 	self deny: result == editor subject.
- 	self assert: result aleph == object!

Item was removed:
- ----- Method: ClassEditorOntologyTest>>test07MetaSuperclass (in category 'tests') -----
- test07MetaSuperclass
- 	"MetaclassEditor's ivar called 'superclass' should point to ClassEditor,
- 	but the method #superclass return an editor on the superclass of the
- 	editor's subject."
- 
- 	self assert: editor class superclass subject == EditorSubject class superclass!

Item was removed:
- ----- Method: ClassEditorProtocolTest>>test37ClassVariablesString (in category 'tests') -----
- test37ClassVariablesString
- 
- 	self assert: editor classVariablesString = editor subject classVariablesString!

Item was removed:
- ----- Method: AbstractEditor class>>on:for: (in category 'as yet unclassified') -----
- on: subject for: collectionEditor
- 	^ self on: subject for: collectionEditor ifNotHandled: [self error:
- 		self class name, ' does not know how to edit ', subject printString]!

Item was removed:
- ----- Method: ClassEditorBuildTest>>test13NoSubject (in category 'tests') -----
- test13NoSubject
- 	
- 	| result |
- 	editor := ClassEditor forNewClassNamed: #EditorSubject2.
- 	result := editor product.
- 	self assert: result name = #EditorSubject2!

Item was removed:
- ----- Method: Object>>edIsEditor (in category '*systemeditor-core') -----
- edIsEditor
- 	^ false!

Item was removed:
- ----- Method: ObjectMigrator>>origin (in category 'accessing') -----
- origin
- 	^ origin!

Item was removed:
- ----- Method: ClassEditorBuildTest>>test11MethodAdded (in category 'tests') -----
- test11MethodAdded
- 	
- 	| dict selector |
- 	selector := editor 
- 				compile: 'zayin ^ 2'
- 				classified: 'numbers'
- 				withStamp: 'cwp 5/30/2004 09:27'
- 				notifying: nil
- 				logSource: true.
- 	dict := editor methodDictionary.
- 	self deny: editor edRequiresBuild.
- 	self assert: (dict at: #zayin) isCompiledMethod.
- 	self assert: selector == #zayin
- !



More information about the Packages mailing list