[squeak-dev] The Trunk: Monticello-ar.353.mcz

commits at source.squeak.org commits at source.squeak.org
Mon Jan 4 23:44:56 UTC 2010


Andreas Raab uploaded a new version of Monticello to project The Trunk:
http://source.squeak.org/trunk/Monticello-ar.353.mcz

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

Name: Monticello-ar.353
Author: ar
Time: 4 January 2010, 4:30:10 am
UUID: ec409d18-6558-7c49-98e8-052e90812b41
Ancestors: Monticello-nice.352

Making Tests unloadable: Move Monticello-Tests to Tests-Monticello.

=============== Diff against Monticello-nice.352 ===============

Item was changed:
  SystemOrganization addCategory: #'Monticello-Base'!
  SystemOrganization addCategory: #'Monticello-Chunk Format'!
  SystemOrganization addCategory: #'Monticello-Loading'!
  SystemOrganization addCategory: #'Monticello-Merging'!
  SystemOrganization addCategory: #'Monticello-Mocks'!
  SystemOrganization addCategory: #'Monticello-Modeling'!
  SystemOrganization addCategory: #'Monticello-Patching'!
  SystemOrganization addCategory: #'Monticello-Repositories'!
  SystemOrganization addCategory: #'Monticello-Storing'!
- SystemOrganization addCategory: #'Monticello-Tests'!
  SystemOrganization addCategory: #'Monticello-UI'!
  SystemOrganization addCategory: #'Monticello-Versioning'!

Item was removed:
- ----- Method: MCDependencySorterTest>>testExtraProvisions (in category 'tests') -----
- testExtraProvisions
- 	self assertItems:
- 		#((a (x) (z))
- 		(b () (x)))
- 	orderAs: #(a b)
- 	withRequired: #()
- 	toLoad: #()	
- 	extraProvisions: #(x z)!

Item was removed:
- ----- Method: MCMergingTest>>assertMerge:with:base:gives:conflicts: (in category 'asserting') -----
- assertMerge: local with: remote base: ancestor gives: result conflicts: conflictResult
- 	| merger |
- 	conflicts := #().
- 	merger := MCThreeWayMerger
- 				base: (self snapshotWithElements: local)
- 				target: (self snapshotWithElements: remote)
- 				ancestor: (self snapshotWithElements: ancestor).
- 	merger conflicts do: [:ea | self handleConflict: ea].
- 	self assert: merger mergedSnapshot definitions hasElements: result.
- 	self assert: conflicts asSet = conflictResult asSet.!

Item was removed:
- ----- Method: MCDependencySorterTest>>testUnusedAlternateProvider (in category 'tests') -----
- testUnusedAlternateProvider
- 	self assertItems: #(
- 		(a (x) (z))
- 		(b () (x))
- 		(c (x) ()))
- 	orderAs: #(c b)
- 	withRequired: #(z)
- 	toLoad: #(a)	!

Item was removed:
- ----- Method: MCScannerTest>>test4 (in category 'tests') -----
- test4
- 	self assertScans: #(a '23' (x () ')''q' y12)).!

Item was removed:
- ----- Method: MCTestCase>>mockVersionInfo: (in category 'mocks') -----
- mockVersionInfo: tag 
- 	^ MCVersionInfo
- 		name: self mockVersionName, '-', tag asString
- 		id: UUID new
- 		message: self mockMessageString, '-', tag asString
- 		date: Date today
- 		time: Time now
- 		author: Utilities authorInitials 
- 		ancestors: #()
- !

Item was removed:
- ----- Method: MCTestCase>>change:toReturn: (in category 'compiling') -----
- change: aSelector toReturn: anObject
- 	self 
- 		compileClass: self mockClassA 
- 		source: aSelector, ' ^ ', anObject printString 
- 		category: 'numeric'!

Item was removed:
- ----- Method: MCTestCase>>mockEmptyPackage (in category 'mocks') -----
- mockEmptyPackage
- 	^ MCPackage named: (MCEmptyPackageInfo new packageName)!

Item was removed:
- ----- Method: MCStWriterTest>>assertChunkIsWellFormed: (in category 'asserting') -----
- assertChunkIsWellFormed: chunk
- 	self class parserClass new
- 		parse: chunk readStream 
- 		class: UndefinedObject 
- 		noPattern: true
- 		context: nil
- 		notifying: nil
- 		ifFail: [self assert: false]!

Item was removed:
- ----- Method: MCMczInstallerTest>>setUp (in category 'as yet unclassified') -----
- setUp
- 	expected := self mockVersion.
- 	self change: #one toReturn: 2.!

Item was removed:
- ----- Method: MCAncestryTest>>testPathToMissingAncestor (in category 'tests') -----
- testPathToMissingAncestor
- 	self assert: (self tree allAncestorsOnPathTo: MCVersionInfo new) isEmpty!

Item was removed:
- MCTestCase subclass: #MCOrganizationTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>definedClasses (in category 'private') -----
- definedClasses
- 	^ MCSnapshotResource current definitions 
- 		select: [:def | def isClassDefinition] 
- 		thenCollect: [:def | def className].!

Item was removed:
- ----- Method: MCStWriterTest>>expectedClassMethodDefinition (in category 'data') -----
- expectedClassMethodDefinition
- 	^ '
- !!MCMockClassA class methodsFor: ''as yet unclassified'' stamp: ''ab 7/7/2003 23:21''!!
- one
- 
- 	^ 1!! !!
- '!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>testTextPane (in category 'testing') -----
- testTextPane
- 	self shouldnt: [self textMorph] raise: Exception.!

Item was removed:
- ----- Method: MCClassDefinitionTest>>testCreation (in category 'as yet unclassified') -----
- testCreation
- 	| d |
- 	d :=  self mockClassA asClassDefinition.
- 	self assert: d className = #MCMockClassA.
- 	self assert: d superclassName = #MCMock.
- 	self assert: d type = #normal.
- 	self assert: d category = self mockCategoryName.
- 	self assert: d instVarNames asArray = #('ivar').
- 	self assert: d classVarNames asArray = #('CVar').
- 	self assert: d classInstVarNames asArray = #().
- 	self assert: d comment isString.
- 	self assert: d comment = self classAComment.
- 	self assert: d commentStamp = self mockClassA organization commentStamp!

Item was removed:
- ----- Method: MCStReaderTest>>commentWithStyle (in category 'as yet unclassified') -----
- commentWithStyle
- 	^ '!!AEDesc commentStamp: ''<historical>'' prior: 0!!
- I represent an Apple Event Descriptor.  I am a low-level representation of Apple Event (and hence Applescript) information.  For further Information, see Apple''s Inside Macintosh: Interapplication Communications, at
- 
- 	http://developer.apple.com/techpubs/mac/IAC/IAC-2.html.
- 
- Essentially, I represent a record comprising a one-word "string" (treating the word as fourbyte characters) representing a data type, followed by a pointer to a pointer (a handle) to the data I represent.  Care must be taken to assure that the Handle data is disposed after use, or memory leaks result.  At this time, I make no effort to do this automatically through finalization.!!
- ]style[(218 54 384)f1,f1Rhttp://developer.apple.com/techpubs/mac/IAC/IAC-2.html;,f1!!
- '!

Item was removed:
- ----- Method: MCTestCase>>mockVersionWithAncestor: (in category 'mocks') -----
- mockVersionWithAncestor: aMCVersion 
- 	^ MCVersion
- 		package: self mockPackage
- 		info: (self mockVersionInfoWithAncestor: aMCVersion info)
- 		snapshot: self mockSnapshot!

Item was removed:
- ----- Method: MCTestCase>>mockVersionInfoWithAncestor: (in category 'mocks') -----
- mockVersionInfoWithAncestor: aVersionInfo 
- 	^ MCVersionInfo
- 		name: aVersionInfo name, '-child'
- 		id: UUID new
- 		message: self mockMessageString
- 		date: Date today
- 		time: Time now
- 		author: Utilities authorInitials 
- 		ancestors: {aVersionInfo}
- !

Item was removed:
- ----- Method: MCStWriterTest>>testClassMethodDefinition (in category 'testing') -----
- testClassMethodDefinition
- 	writer visitMethodDefinition: (MethodReference class: self mockClassA class selector: #one) 									asMethodDefinition.
- 	self assertContentsOf: stream match: self expectedClassMethodDefinition.
- 	stream reset.
- 	self assert: stream nextChunk isAllSeparators.
- 	self assertChunkIsWellFormed: stream nextChunk.
- 	self assertMethodChunkIsWellFormed: stream nextChunk.
- 	self assert: stream nextChunk isAllSeparators !

Item was removed:
- ----- Method: MCTestCase>>mockVersionWithDependencies (in category 'mocks') -----
- mockVersionWithDependencies
- 	^ MCVersion 
- 		package: self mockPackage
- 		info: self mockVersionInfo
- 		snapshot: self mockSnapshot
- 		dependencies: self mockDependencies!

Item was removed:
- MCTestCase subclass: #MCRepositoryTest
- 	instanceVariableNames: 'repository ancestors'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>classABooleanMethods (in category 'private') -----
- classABooleanMethods
- 	^ #(falsehood moreTruth truth)!

Item was removed:
- ----- Method: MCWorkingCopyTest>>testMergeIntoUnmodifiedImage (in category 'tests') -----
- testMergeIntoUnmodifiedImage
- 	| base revA |
- 
- 	base := self snapshot.
- 	self change: #a toReturn: 'a1'.
- 	revA := self snapshot.
- 	
- 	self load: base.
- 
- 	self merge: revA.
- 
- 	self assert: (workingCopy ancestors size = 1)
- 	!

Item was removed:
- ----- Method: MCSerializationTest>>assertClass:providesServices: (in category 'asserting') -----
- assertClass: readerClass providesServices: labels
- 	| services suffix |
- 	suffix := readerClass extension.
- 	self assert: (FileList isReaderNamedRegistered: readerClass name).
- 	services := readerClass fileReaderServicesForFile: 'foo' suffix: suffix.
- 	self assert: ((services collect: [:service | service buttonLabel]) includesAllOf: labels)!

Item was removed:
- ----- Method: MCTestCase>>mockSnapshot (in category 'mocks') -----
- mockSnapshot
- 	^ MCSnapshotResource current snapshot!

Item was removed:
- ----- Method: MCTestCase>>mockClass:super: (in category 'mocks') -----
- mockClass: className super: superclassName
- 	^ MCClassDefinition
- 		name:  className
- 		superclassName:  superclassName
- 		category: self mockCategoryName
- 		instVarNames: #()
- 		classVarNames: #()
- 		poolDictionaryNames: #()
- 		classInstVarNames: #()
- 		type: #normal
- 		comment: (self commentForClass: className)
- 		commentStamp: (self commentStampForClass: className)!

Item was removed:
- ----- Method: MCVersionTest>>assert:orders:as:unresolved: (in category 'asserting') -----
- assert: aSelector orders: sexpr as: expected unresolved: unresolved
- 	| missing |
- 	missing := OrderedCollection new.
- 	version := self versionFromTree: sexpr.
- 	version 
- 		perform: aSelector 
- 		with: [:ea | visited add: ea info name]
- 		with: [:ea | missing add: ea name].
- 	self assert: visited asArray = expected.
- 	self assert: missing asArray = unresolved.!

Item was removed:
- MCTestCase subclass: #MCClassDefinitionTest
- 	instanceVariableNames: 'previousChangeSet'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCRepositoryTest>>versionWithSnapshot:name: (in category 'building') -----
- versionWithSnapshot: aSnapshot name: aString
- 	| info |
- 	info := self mockVersionInfo: aString. 
- 	^ MCVersion 
- 		package: (MCPackage new name: aString)
- 		info: info
- 		snapshot: aSnapshot!

Item was removed:
- ----- Method: MCWorkingCopyTest>>description (in category 'accessing') -----
- description
- 	^ self class name!

Item was removed:
- ----- Method: MCMergingTest>>testSimultaneousRemove (in category 'tests') -----
- testSimultaneousRemove
- 	self assertMerge: #(a1)
- 				with: #(a1)
- 				base: #(a1 b1)
- 				
- 				gives: #(a1)
- 				conflicts: #()!

Item was removed:
- ----- Method: MCDictionaryRepositoryTest>>addVersion: (in category 'as yet unclassified') -----
- addVersion: aVersion
- 	dict at: aVersion info put: aVersion!

Item was removed:
- ----- Method: MCWorkingCopyTest>>tearDown (in category 'running') -----
- tearDown
- 	workingCopy unregister.
- 	self restoreMocks.
- 	self clearPackageCache.
- 	Utilities setAuthorInitials: savedInitials.!

Item was removed:
- ----- Method: MCMergingTest>>testLocalRemoveRemoteModify (in category 'tests') -----
- testLocalRemoveRemoteModify
- 	self assertMerge: #(b1)
- 				with: #(a1 b1)
- 				base: #(a2 b1)
- 				
- 				gives: #(a1 b1)
- 				conflicts: #((a1 removed)).
- 
- 	self assertMerge: #(b1)
- 				with: #(a2 b1)
- 				base: #(a1 b1)
- 				
- 				gives: #(a2 b1)
- 				conflicts: #((a2 removed)).!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>protocolsForClass: (in category 'private') -----
- protocolsForClass: aClass
- 	| protocols |
- 	protocols := aClass organization categories.
- 	protocols size > 1 ifTrue: [protocols := protocols copyWith: '-- all --'].
- 	^ protocols.!

Item was removed:
- ----- Method: MCWorkingCopyTest>>testDoubleRepeatedMerge (in category 'tests') -----
- testDoubleRepeatedMerge
- 	| base motherA1 motherA2 motherB1 motherB2 inst |
- 
- 	base := self snapshot.
- 	self change: #a toReturn: 'a1'.
- 	motherA1 :=  self snapshot.
- 	self change: #c toReturn: 'c1'.
- 	motherA2 :=  self snapshot.	
- 	
- 	self load: base.
- 	self change: #b toReturn: 'b1'.
- 	motherB1 :=  self snapshot.
- 	self change: #d toReturn: 'd1'.
- 	motherB2 :=  self snapshot.
- 	
- 	self load: base.
- 	self merge: motherA1.
- 	self merge: motherB1.
- 	self change: #a toReturn: 'a2'.
- 	self change: #b toReturn: 'b2'.
- 	self snapshot.
- 
- 	self shouldnt: [self merge: motherA2] raise: Error.
- 	self shouldnt: [self merge: motherB2] raise: Error.
- 	
- 	inst := self mockInstanceA.
- 	self assert: inst a = 'a2'.
- 	self assert: inst b = 'b2'.
- 	self assert: inst c = 'c1'.
- 	self assert: inst d = 'd1'.
- 	!

Item was removed:
- ----- Method: MCWorkingCopyTest>>testMergeIntoImageWithNoChanges (in category 'tests') -----
- testMergeIntoImageWithNoChanges
- 	| base revB revA1 |
- 
- 	self change: #a toReturn: 'a'.
- 	base := self snapshot.
- 	self change: #b toReturn: 'b'.
- 	revB := self snapshot.
- 	
- 	self load: base.
- 	self change: #a toReturn: 'a1'.
- 	revA1 := self snapshot.
- 
- 	self change: #a toReturn: 'a'.
- 	self snapshot.
- 	self merge: revB.
- 
- 	self assert: (workingCopy ancestors size = 2)
- 	!

Item was removed:
- ----- Method: MCMethodDefinitionTest>>testCannotLoad (in category 'testing') -----
- testCannotLoad
- 	| definition |
- 	definition := self mockMethod: #kjahs87 class: 'NoSuchClass' source: 'kjahs87 ^self' meta: false.
- 	self should: [definition load] raise: Error.
- 	self assert: (navigation allImplementorsOf: #kjahs87) isEmpty!

Item was removed:
- ----- Method: MCStWriterTest>>setUp (in category 'testing') -----
- setUp
- 	stream := RWBinaryOrTextStream on: String new.
- 	writer := MCStWriter on: stream.
- !

Item was removed:
- MCTestCase subclass: #MCChangeNotificationTest
- 	instanceVariableNames: 'workingCopy'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>testMethodIsCleared (in category 'testing') -----
- testMethodIsCleared
- 	self clickOnListItem: self mockCategoryName.
- 	self clickOnListItem: 'MCMockClassA'.
- 	self clickOnListItem: 'boolean'.
- 	self clickOnListItem: 'falsehood'.
- 	self clickOnListItem: '-- all --'.
- 	
- 	self denyAListHasSelection: 'falsehood'.!

Item was removed:
- ----- Method: MCOrganizationTest>>testReorderingWithNoCategoriesInVersion (in category 'as yet unclassified') -----
- testReorderingWithNoCategoriesInVersion
- 	|dec cats newCats |
- 	dec := MCOrganizationDefinition categories: #().
- 	cats := #(X Y B Z C A Q).
- 	newCats := dec reorderCategories: cats original: #().
- 	self assert: newCats asArray = cats.!

Item was removed:
- MCTestCase subclass: #MCFileInTest
- 	instanceVariableNames: 'stream expected diff'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCMergingTest>>handleConflict: (in category 'emulating') -----
- handleConflict: aConflict	
- 	|l r|
- 	l := #removed.
- 	r := #removed.
- 	aConflict localDefinition ifNotNil: [:d | l := d token].
- 	aConflict remoteDefinition ifNotNil: [:d | r := d token].	
- 	conflicts := conflicts copyWith: (Array with: r with: l).
- 	(l = #removed or: [r = #removed])
- 		ifTrue: [aConflict chooseRemote]
- 		ifFalse:
- 			[l > r
- 				ifTrue: [aConflict chooseLocal]
- 				ifFalse: [aConflict chooseRemote]]
- 		!

Item was removed:
- ----- Method: MCStWriterTest>>expectedClassDefinitionB (in category 'data') -----
- expectedClassDefinitionB
-  ^ '
- MCMock subclass: #MCMockClassB
- 	instanceVariableNames: ''ivarb''
- 	classVariableNames: ''CVar''
- 	poolDictionaries: ''MCMockAPoolDictionary''
- 	category: ''Monticello-Mocks''!!
- 
- MCMockClassB class
- 	instanceVariableNames: ''ciVar''!!
- 
- !!MCMockClassB commentStamp: '''' prior: 0!!
- This comment has a bang!!!! Bang!!!! Bang!!!!!!
- '!

Item was removed:
- ----- Method: MCScannerTest>>test3 (in category 'tests') -----
- test3
- 	self assert: (MCScanner scan: '(a #b c)' readStream) = #(a #b c)!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>assertAListMatches: (in category 'asserting') -----
- assertAListMatches: strings
- 	| listMorphs |
- 	listMorphs := self listMorphs.
- 	listMorphs 
- 		detect: [:m | | list |
- 			list := m getList. (list size = strings size) and: [list includesAllOf: strings]]
- 		ifNone: [self assert: false].!

Item was removed:
- MCTestCase subclass: #MCMczInstallerTest
- 	instanceVariableNames: 'expected diff'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>testProtocolIsCleared (in category 'testing') -----
- testProtocolIsCleared
- 	self clickOnListItem: self mockCategoryName.
- 	self clickOnListItem: 'MCMockASubclass'.
- 	self clickOnListItem: 'as yet unclassified'.
- 	self clickOnListItem: 'MCMockClassA'.
- 	
- 	self denyAListHasSelection: 'as yet unclassified'.!

Item was removed:
- ----- Method: MCMethodDefinitionTest>>testRevertOldMethod (in category 'testing') -----
- testRevertOldMethod
- 	| definition changeRecord |
- 	Object compile: 'yourself ^ self' classified: MCMockPackageInfo new methodCategoryPrefix.
- 	definition := (MethodReference class: Object selector: #yourself) asMethodDefinition.
- 	changeRecord := definition scanForPreviousVersion.
- 	self assert: changeRecord notNil.
- 	self assert: changeRecord category = 'accessing'.
- 	changeRecord fileIn.!

Item was removed:
- ----- Method: MCSortingTest>>sortDefinitions: (in category 'actions') -----
- sortDefinitions: aCollection
- 	^ aCollection asSortedCollection asArray!

Item was removed:
- ----- Method: MCMczInstallerTest>>tearDown (in category 'as yet unclassified') -----
- tearDown
- 	expected snapshot updatePackage: self mockPackage.
- 	self deleteFile.!

Item was removed:
- ----- Method: MCTestCase>>treeFrom: (in category 'mocks') -----
- treeFrom: anArray
- 	| name id |
- 	name := anArray first.
- 	id := '00000000-0000-0000-0000-0000000000', (name asString size = 1 ifTrue: [name asString, '0'] ifFalse: [name asString]).
- 	^ MCVersionInfo
- 		name: name
- 		id: (UUID fromString: id)
- 		message: ''
- 		date: nil
- 		time: nil
- 		author: ''
- 		ancestors: (anArray size > 1 ifTrue: [(anArray second collect: [:ea | self treeFrom: ea])] ifFalse: [#()])!

Item was removed:
- ----- Method: MCFileInTest>>alterInitialState (in category 'testing') -----
- alterInitialState
- 	self mockClassA touchCVar!

Item was removed:
- MCTestCase subclass: #MCMergingTest
- 	instanceVariableNames: 'conflictBlock conflicts'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCAncestryTest>>assertCommonAncestorOf:and:in:in: (in category 'asserting') -----
- assertCommonAncestorOf: leftName and: rightName in: options in: tree
- 	| left right ancestor |
- 	left := self versionForName: leftName in: tree.
- 	right := self versionForName: rightName in: tree.
- 	
- 	ancestor := left commonAncestorWith: right.
- 	
- 	self assert: (options includes: ancestor name)!

Item was removed:
- ----- Method: MCOrganizationTest>>testReordering (in category 'as yet unclassified') -----
- testReordering
- 	|dec cats newCats |
- 	dec := MCOrganizationDefinition categories: #(A B C).
- 	cats := #(X Y B Z C A Q).
- 	newCats := dec reorderCategories: cats original: #(B C A).
- 	self assert: newCats asArray = #(X Y A B C Z Q).!

Item was removed:
- ----- Method: MCMczInstallerTest>>assertDict:matchesInfo: (in category 'as yet unclassified') -----
- assertDict: dict matchesInfo: info
- 	#(name id message date time author)
- 		do: [:sel |  (info perform: sel) ifNotNil: [:i | dict at: sel ifPresent: [:d | self assert: i = d]]].
- 	info ancestors 
- 			with: (dict at: #ancestors) 
- 			do: [:i :d | self assertDict: d matchesInfo: i]!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>textMorph (in category 'morphic') -----
- textMorph
- 	^ (self morphsOfClass: TextMorph) last!

Item was removed:
- ----- Method: MCVersionTest>>testWithAllUnresolved (in category 'tests') -----
- testWithAllUnresolved
- 	self 
- 		assert: #withAllDependenciesDo:ifUnresolved: 
- 		orders: #(a ((b (d e)) (c missing)))
- 		as: #(d e b a)
- 		unresolved: #(c)!

Item was removed:
- ----- Method: MCChangeNotificationTest>>modifiedEventFor:ofClass: (in category 'events') -----
- modifiedEventFor: aSelector ofClass: aClass
- 	| method |
- 	method := aClass compiledMethodAt: aSelector.
- 	^ ModifiedEvent 
- 				methodChangedFrom: method
- 				to: method
- 				selector: aSelector
- 				inClass: aClass.
- !

Item was removed:
- ----- Method: MCMethodDefinitionTest>>override (in category 'mocks') -----
- override ^ 1!

Item was removed:
- ----- Method: MCVersionTest>>testWithAll (in category 'tests') -----
- testWithAll
- 	self 
- 		assert: #withAllDependenciesDo: 
- 		orders: #(a ((b (d e)) c)) 
- 		as: #(d e b c a)!

Item was removed:
- ----- Method: MCStWriterTest>>expectedMethodDefinition (in category 'data') -----
- expectedMethodDefinition
- 	^ '
- !!MCMockClassA methodsFor: ''numeric'' stamp: ''cwp 8/2/2003 17:26''!!
- one
- 	^ 1!! !!
- '!

Item was removed:
- ----- Method: MCMczInstallerTest>>fileName (in category 'as yet unclassified') -----
- fileName
- 	^ 'InstallerTest.mcz'!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>setUp (in category 'running') -----
- setUp
- 	model := MCSnapshotBrowser forSnapshot: MCSnapshotResource current snapshot.
- 	morph := model buildWindow.!

Item was removed:
- ----- Method: MCRepositoryTest>>testStoreAndLoad (in category 'tests') -----
- testStoreAndLoad
- 	| node node2 |
- 	node := self saveSnapshot1.
- 	node2 := self saveSnapshot2.
- 	self assert: (self snapshotAt: node) = self snapshot1.
- 	self assert: (self snapshotAt: node2) = self snapshot2.!

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

Item was removed:
- ----- Method: MCMethodDefinitionTest>>ownPackage (in category 'running') -----
- ownPackage
- 	^ MCWorkingCopy forPackage: (MCPackage named: 'Monticello')!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>buttonMorphs (in category 'morphic') -----
- buttonMorphs
- 	^ self morphsOfClass: PluggableButtonMorph!

Item was removed:
- ----- Method: MCClassDefinitionTest class>>classACommentStamp (in category 'as yet unclassified') -----
- classACommentStamp
- 	^  'cwp 8/10/2003 16:43'!

Item was removed:
- ----- Method: MCWorkingCopyTest>>testSimpleMerge (in category 'tests') -----
- testSimpleMerge
- 	| mother base inst |
- 	inst := self mockInstanceA.
- 	base :=  self snapshot.
- 	self change: #one toReturn: 2.
- 	mother :=  self snapshot.
- 	self load: base.
- 	self change: #two toReturn: 3.
- 	self snapshot.
- 	self assert: inst one = 1.
- 	self assert: inst two = 3.
- 	
- 	self merge: mother.
- 	self assert: inst one = 2.
- 	self assert: inst two = 3.!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>classAProtocols (in category 'private') -----
- classAProtocols
- 	^ self protocolsForClass: self mockClassA.!

Item was removed:
- ----- Method: MCMethodDefinitionTest>>testRevertOverrideMethod (in category 'testing') -----
- testRevertOverrideMethod
- 	| definition |
- 	self class compile: 'override ^ 2' classified: self mockOverrideMethodCategory.
- 	definition := (MethodReference class: self class selector: #override) asMethodDefinition.
- 	self assert: definition isOverrideMethod.
- 	self assert: self override = 2.
- 	definition unload.
- 	self assert: self override = 1.
- 	self assert: (MethodReference class: self class selector: #override) category = 'mocks'.
- 	!

Item was removed:
- ----- Method: MCMethodDefinitionTest>>setUp (in category 'running') -----
- setUp
- 	navigation := (Smalltalk hasClassNamed: #SystemNavigation)
- 		ifTrue: [(Smalltalk at: #SystemNavigation) new]
- 		ifFalse: [Smalltalk].
- 	isModified := self ownPackage modified.!

Item was removed:
- ----- Method: MCWorkingCopyTest>>packageName (in category 'private') -----
- packageName
- 	^ self mockPackage name!

Item was removed:
- ----- Method: MCDependencySorterTest>>testCascadingUnresolved (in category 'tests') -----
- testCascadingUnresolved
- 	self assertItems: #(
- 		(a (x) (z))
- 		(b () (x))
- 		(c () ()))
- 	orderAs: #(c)
- 	withRequired: #(z)
- 	toLoad: #(a b)	!

Item was removed:
- ----- Method: MCChangeNotificationTest>>testExtMethodModified (in category 'tests') -----
- testExtMethodModified
- 	| event mref |
- 	workingCopy modified: false.
- 	mref := workingCopy packageInfo extensionMethods first.
- 	event := self modifiedEventFor: mref methodSymbol ofClass: mref actualClass.
- 	MCWorkingCopy methodModified: event.
- 	self assert: workingCopy modified!

Item was removed:
- MCTestCase subclass: #MCStReaderTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCScannerTest>>assertScans: (in category 'asserting') -----
- assertScans: anArray
- 	self assert: (MCScanner scan: anArray printString readStream) = anArray!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>allProtocols (in category 'private') -----
- allProtocols
- 	^ MCSnapshotResource current definitions
- 		select: [:def | def isMethodDefinition]
- 		thenCollect: [:def | def category]		!

Item was removed:
- ----- Method: MCMczInstallerTest>>deleteFile (in category 'as yet unclassified') -----
- deleteFile
- 	(FileDirectory default fileExists: self fileName)
- 		ifTrue: [FileDirectory default deleteFileNamed: self fileName]!

Item was removed:
- ----- Method: MCSnapshotTest>>testInstanceReuse (in category 'tests') -----
- testInstanceReuse
- 	| x m n y |
- 	x := (MCPackage new name: self mockCategoryName) snapshot.
- 	Smalltalk garbageCollect.
- 	n := MCDefinition allSubInstances size.
- 	y := (MCPackage new name: self mockCategoryName) snapshot.
- 	Smalltalk garbageCollect.
- 	m := MCDefinition allSubInstances size.
- 	self assert: m = n!

Item was removed:
- ----- Method: MCRepositoryTest>>testIncludesName (in category 'tests') -----
- testIncludesName
- 	self deny: (repository includesVersionNamed: 'MonticelloTest-xxx.1-rev1').
- 	self saveSnapshot1.
- 	self assert: (repository includesVersionNamed: 'MonticelloTest-xxx.1-rev1').
- 	self deny: (repository includesVersionNamed: 'MonticelloTest-xxx.1-rev2').
- 	self saveSnapshot2.
- 	self assert:  (repository includesVersionNamed: 'MonticelloTest-xxx.1-rev2').!

Item was removed:
- ----- Method: MCDependencySorterTest>>itemWithSpec: (in category 'building') -----
- itemWithSpec: anArray
- 	^ MCMockDependentItem new
- 		name: anArray first;
- 		provides: anArray second;
- 		requires: anArray third!

Item was removed:
- ----- Method: MCTestCase>>mockExtensionMethodCategory (in category 'mocks') -----
- mockExtensionMethodCategory
- 	^ MCMockPackageInfo new methodCategoryPrefix.!

Item was removed:
- ----- Method: MCDictionaryRepositoryTest>>setUp (in category 'as yet unclassified') -----
- setUp
- 	repository :=  MCDictionaryRepository new dictionary: self dictionary!

Item was removed:
- ----- Method: MCSerializationTest>>testMcdSerialization (in category 'testing') -----
- testMcdSerialization
- 	| stream expected actual |
- 	expected := self mockDiffyVersion.
- 	stream := RWBinaryOrTextStream on: String new.
- 	MCMcdWriter fileOut: expected on: stream.
- 	actual := MCMcdReader versionFromStream: stream reset.
- 	self assertVersion: actual matches: expected.!

Item was removed:
- ----- Method: MCStWriterTest>>expectedClassDefinitionA (in category 'data') -----
- expectedClassDefinitionA
-  ^ '
- MCMock subclass: #MCMockClassA
- 	instanceVariableNames: ''ivar''
- 	classVariableNames: ''CVar''
- 	poolDictionaries: ''''
- 	category: ''Monticello-Mocks''!!
- 
- !!MCMockClassA commentStamp: ''cwp 8/10/2003 16:43'' prior: 0!!
- This is a mock class. The Monticello tests manipulated it to simulate a developer modifying code in the image.!!
- '!

Item was removed:
- ----- Method: MCScannerTest>>test2 (in category 'tests') -----
- test2
- 	self assertScans: 'it''s alive'!

Item was removed:
- ----- Method: MCTestCase>>mockVersionName (in category 'mocks') -----
- mockVersionName
- 	^ 'MonticelloTest-xxx.1'!

Item was removed:
- ----- Method: MCChangeNotificationTest>>foreignMethod (in category 'private') -----
- foreignMethod
- 	"see testForeignMethodModified"!

Item was removed:
- ----- Method: MCRepositoryTest>>saveSnapshot2 (in category 'actions') -----
- saveSnapshot2
- 	^ self saveSnapshot: self snapshot2 named: 'rev2'!

Item was removed:
- ----- Method: MCDependencySorterTest>>testSimpleUnresolved (in category 'tests') -----
- testSimpleUnresolved
- 	self assertItems: #(
- 		(a () (z)))
- 	orderAs: #()
- 	withRequired: #(z)
- 	toLoad: #(a)
- 		!

Item was removed:
- ----- Method: MCAncestryTest>>assertNamesOf:are: (in category 'asserting') -----
- assertNamesOf: versionInfoCollection are: nameArray
- 	| names |
- 	names := versionInfoCollection collect: [:ea | ea name].
- 	
- 	self assert: names asArray = nameArray!

Item was removed:
- ----- Method: MCTestCase>>restoreMocks (in category 'compiling') -----
- restoreMocks
- 	self mockSnapshot updatePackage: self mockPackage!

Item was removed:
- ----- Method: MCStWriterTest>>testInitializerDefinition (in category 'testing') -----
- testInitializerDefinition
- 	|chunk lastChunk|
- 	writer writeSnapshot: self mockSnapshot.
- 	stream reset.
- 	[stream atEnd] whileFalse:
- 		[chunk := stream nextChunk.
- 		chunk isAllSeparators ifFalse: [lastChunk := chunk]].
- 	self assertContentsOf: lastChunk readStream match: self expectedInitializerA!

Item was removed:
- ----- Method: MCClassDefinitionTest>>tearDown (in category 'as yet unclassified') -----
- tearDown
- 	Smalltalk at: 'MCMockClassC' ifPresent: [:c | c removeFromSystem]!

Item was removed:
- ----- Method: MCClassDefinitionTest>>testLoadAndUnload (in category 'as yet unclassified') -----
- testLoadAndUnload
- 	| d c |
- 	d :=  self mockClass: 'MCMockClassC' super: 'Object'.
- 	d load.
- 	self assert: (Smalltalk hasClassNamed: 'MCMockClassC').
- 	c := (Smalltalk classNamed: 'MCMockClassC').
- 	self assert: (c isKindOf: Class).
- 	self assert: c superclass = Object.
- 	self assert: c instVarNames isEmpty.
- 	self assert: c classVarNames isEmpty.
- 	self assert: c sharedPools isEmpty.
- 	self assert: c category = self mockCategoryName.
- 	self assert: c organization classComment = (self commentForClass: 'MCMockClassC').
- 	self assert: c organization commentStamp = (self commentStampForClass: 'MCMockClassC').
- 	d unload.
- 	self deny: (Smalltalk hasClassNamed: 'MCMockClassC').!

Item was removed:
- ----- Method: MCStReaderTest>>testCommentWithStyle (in category 'as yet unclassified') -----
- testCommentWithStyle
- 	| reader |
- 	reader := MCStReader on: self commentWithStyle readStream.
- 	reader definitions!

Item was removed:
- ----- Method: MCSortingTest>>testConsistentSorting (in category 'tests') -----
- testConsistentSorting
- 	| definitions shuffledAndSorted|
- 	definitions :=
- 		{self methodNamed: #a class: #A meta: false.
- 		self methodNamed: #a class: #A meta: true.
- 		self methodNamed: #a class: #B meta: false.
- 		self methodNamed: #b class: #A meta: false.
- 		self methodNamed: #b class: #B meta: false.
- 		self classNamed: #A.
- 		self classNamed: #B}.
- 	shuffledAndSorted :=
- 		(1 to: 100) collect: [:ea | self sortDefinitions: definitions shuffled].
- 	self assert: shuffledAndSorted asSet size = 1.
- !

Item was removed:
- MCTestCase subclass: #MCStWriterTest
- 	instanceVariableNames: 'stream writer'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCMczInstallerTest>>fileStream (in category 'as yet unclassified') -----
- fileStream
- 	^ FileStream forceNewFileNamed: self fileName.!

Item was removed:
- ----- Method: MCFileInTest>>assertSuccessfulLoadWith: (in category 'testing') -----
- assertSuccessfulLoadWith: aBlock
- 	stream reset.
- 	aBlock value.
- 	self assertNoChange.
- 	self assertInitializersCalled.!

Item was removed:
- ----- Method: MCWorkingCopyTest>>testOptimizedLoad (in category 'tests') -----
- testOptimizedLoad
- 	| inst base diffy |
- 	inst := self mockInstanceA.
- 	base := self snapshot.
- 	self change: #one toReturn: 2.
- 	self assert: inst one = 2.
- 	diffy := self snapshot asDiffAgainst: base.
- 	self deny: diffy canOptimizeLoading.
- 	self load: base.
- 	self assert: inst one = 1.
- 	self assert: diffy canOptimizeLoading.
- 	self load: diffy.
- 	self assert: inst one = 2.
- !

Item was removed:
- ----- Method: MCStWriterTest>>expectedInitializerA (in category 'testing') -----
- expectedInitializerA
- 	^ 'MCMockClassA initialize'!

Item was removed:
- ----- Method: MCSnapshotResource class>>takeSnapshot (in category 'as yet unclassified') -----
- takeSnapshot
- 	^ self mockPackage snapshot!

Item was removed:
- ----- Method: MCTestCase>>mockToken: (in category 'mocks') -----
- mockToken: aSymbol
- 	^ MCMockDefinition token: aSymbol!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>denyAListIncludesAnyOf: (in category 'asserting') -----
- denyAListIncludesAnyOf: anArrayOfStrings
- 	| found |
- 	found := true.
- 	self listMorphs 
- 			detect: [:m | m getList includesAnyOf: anArrayOfStrings]
- 			ifNone: [found := false].
- 	self deny: found.!

Item was removed:
- TestCase subclass: #MCDependencySorterTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCMczInstallerTest>>testInstallFromFile (in category 'as yet unclassified') -----
- testInstallFromFile
- 	MCMczWriter fileOut: expected on: self fileStream.
- 	MczInstaller installFileNamed: self fileName.
- 	self assertNoChange.!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>testNoSelection (in category 'testing') -----
- testNoSelection
- 	self assertAListMatches: self allCategories.
- 	self denyAListIncludesAnyOf: self definedClasses.
- 	self denyAListIncludesAnyOf: self allProtocols.
- 	self denyAListIncludesAnyOf: self allMethods.
- 	"and if there I need to see the packages scripts (or none)"
- 	self assertTextIs: '(package defines no scripts)'.!

Item was removed:
- ----- Method: MCFileInTest>>testStWriter (in category 'testing') -----
- testStWriter
- 	self
- 		assertFileOutFrom: MCStWriter
- 		canBeFiledInWith: [stream fileIn].
- !

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>assertTextIs: (in category 'asserting') -----
- assertTextIs: aString
- 	self assert: self textMorph contents = aString.!

Item was removed:
- ----- Method: MCMethodDefinitionTest>>tearDown (in category 'running') -----
- tearDown
- 	self restoreMocks.
- 	(MCWorkingCopy forPackage: (MCPackage named: 'FooBarBaz')) unregister.
- 	self class compile: 'override ^ 1' classified: 'mocks'.
- 	self ownPackage modified: isModified!

Item was removed:
- ----- Method: MCMczInstallerTest class>>suite (in category 'as yet unclassified') -----
- suite
- 	^ (Smalltalk hasClassNamed: #MczInstaller)
- 		ifTrue: [super suite]
- 		ifFalse: [TestSuite new name: self name asString]!

Item was removed:
- ----- Method: MCMethodDefinitionTest>>testLoadAndUnload (in category 'testing') -----
- testLoadAndUnload
- 	|definition|
- 	definition := self mockMethod: #one class: 'MCMockClassA' source: 'one ^2' meta: false.
- 	self assert: self mockInstanceA one = 1.
- 	definition load.
- 	self assert: self mockInstanceA one = 2.
- 	definition unload.
- 	self deny: (self mockInstanceA respondsTo: #one)!

Item was removed:
- MCTestCase subclass: #MCSnapshotBrowserTest
- 	instanceVariableNames: 'model morph'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCWorkingCopyTest>>setUp (in category 'running') -----
- setUp
- 	| repos1 repos2 |
- 	self clearPackageCache.
- 	repositoryGroup := MCRepositoryGroup new.
- 	workingCopy := MCWorkingCopy forPackage: self mockPackage.
- 	versions := Dictionary new.
- 	versions2 := Dictionary new.
- 	repos1 := MCDictionaryRepository new dictionary: versions.
- 	repos2 := MCDictionaryRepository new dictionary: versions2.
- 	repositoryGroup addRepository: repos1.
- 	repositoryGroup addRepository: repos2.
- 	MCRepositoryGroup default removeRepository: repos1; removeRepository: repos2.
- 	workingCopy repositoryGroup: repositoryGroup.
- 	savedInitials := Utilities authorInitials.
- 	Utilities setAuthorInitials: 'abc'.!

Item was removed:
- ----- Method: MCTestCase>>assertPackage:matches: (in category 'asserting') -----
- assertPackage: actual matches: expected
- 	self assert: actual = expected
- !

Item was removed:
- MCTestCase subclass: #MCPatchTest
- 	instanceVariableNames: 'patch'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCMergingTest>>testMultiPackageMerge3 (in category 'tests') -----
- testMultiPackageMerge3
- 	| merger |
- 	conflicts := #().
- 	merger := MCThreeWayMerger new.
- 	merger addBaseSnapshot: (self snapshotWithElements: #(a1 b1)).
- 	merger applyPatch: ((self snapshotWithElements: #(a1 b1)) patchRelativeToBase: (self snapshotWithElements: #(b1))).
- 	merger applyPatch: ((self snapshotWithElements: #()) patchRelativeToBase: (self snapshotWithElements: #(a1))).
- 	merger conflicts do: [:ea | self handleConflict: ea].
- 	self assert: merger mergedSnapshot definitions hasElements: #(a1 b1).
- 	self assert: conflicts isEmpty!

Item was removed:
- ----- Method: MCStWriterTest>>assertMethodChunkIsWellFormed: (in category 'asserting') -----
- assertMethodChunkIsWellFormed: chunk
- 	self class parserClass new
- 		parse: chunk readStream 
- 		class: UndefinedObject 
- 		noPattern: false
- 		context: nil
- 		notifying: nil
- 		ifFail: [self assert: false]!

Item was removed:
- ----- Method: MCWorkingCopyTest>>assertNameWhenSavingTo:is: (in category 'asserting') -----
- assertNameWhenSavingTo: aRepository is: aString
- 	| name |
- 	name := nil.
- 	[aRepository storeVersion: workingCopy newVersion]
- 		on: MCVersionNameAndMessageRequest
- 		do: [:n | name := n suggestedName. n resume: (Array with: name with: '')].
- 	self assert: name = aString!

Item was removed:
- ----- Method: MCSnapshotResource class>>mockPackageName (in category 'as yet unclassified') -----
- mockPackageName
- 	^ MCMockPackageInfo new packageName!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>testThreeButtons (in category 'testing') -----
- testThreeButtons
- 	self assertButtonExists: 'instance'.
- 	self assertButtonExists: '?'.
- 	self assertButtonExists: 'class'.!

Item was removed:
- ----- Method: MCVersionTest>>testDependencyOrder (in category 'tests') -----
- testDependencyOrder
- 	self 
- 		assert: #allDependenciesDo: 
- 		orders: #(a (b c)) 
- 		as: #(b c)!

Item was removed:
- ----- Method: MCClassDefinitionTest>>testKindOfSubclass (in category 'as yet unclassified') -----
- testKindOfSubclass
- 	| classes |
- 	classes := {self mockClassA. String. MethodContext. WeakArray. Float}.
- 	classes do: [:c | | d |
- 		d :=  c asClassDefinition.
- 		self assert: d kindOfSubclass = c kindOfSubclass.
- 	].!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>annotationTextMorph (in category 'morphic') -----
- annotationTextMorph
- 	^ (self morphsOfClass: TextMorph) first!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>testCategorySelected (in category 'testing') -----
- testCategorySelected
- 	self clickOnListItem: self mockCategoryName.
- 	
- 	self assertAListMatches: self allCategories.
- 	self assertAListMatches: self definedClasses.
- 	self denyAListIncludesAnyOf: self allProtocols.
- 	self denyAListIncludesAnyOf: self allMethods.
- 	self assertTextIs: ''.!

Item was removed:
- ----- Method: MCTestCase>>mockVersion (in category 'mocks') -----
- mockVersion
- 	^ MCVersion 
- 		package: self mockPackage
- 		info: self mockVersionInfo
- 		snapshot: self mockSnapshot!

Item was removed:
- ----- Method: MCTestCase>>mockInstanceA (in category 'mocks') -----
- mockInstanceA
- 	^ self mockClassA new!

Item was removed:
- ----- Method: MCStWriterTest>>expectedOrganizationDefinition (in category 'data') -----
- expectedOrganizationDefinition
- 	^ 'SystemOrganization addCategory: ''Monticello-Mocks''!!
- '!

Item was removed:
- ----- Method: MCScannerTest>>test1 (in category 'tests') -----
- test1
- 	self assertScans: #(a '23' (x))!

Item was removed:
- ----- Method: MCFileInTest>>assertNoChange (in category 'asserting') -----
- assertNoChange
- 	| actual |
- 	actual := MCSnapshotResource takeSnapshot.
- 	diff := actual patchRelativeToBase: expected.
- 	self assert: diff isEmpty!

Item was removed:
- ----- Method: MCSerializationTest>>testMczSerialization (in category 'testing') -----
- testMczSerialization
- 	self assertVersionsMatchWith: MCMczWriter.
- 	self assertExtensionProvidedBy: MCMczWriter.
- 	self assertVersionInfosMatchWith: MCMczWriter.
- 	self assertDependenciesMatchWith: MCMczWriter.!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>findButtonWithLabel: (in category 'morphic') -----
- findButtonWithLabel: aString
- 	^ self buttonMorphs detect: [:m | m label = aString]!

Item was removed:
- ----- Method: MCRepositoryTest>>saveSnapshot1 (in category 'actions') -----
- saveSnapshot1
- 	^ self saveSnapshot: self snapshot1 named: 'rev1'!

Item was removed:
- ----- Method: MCDependencySorterTest>>testMultiRequirementOrdering (in category 'tests') -----
- testMultiRequirementOrdering
- 	self assertItems: #(
- 		(a (x) (z))
- 		(b (y) ())
- 		(c (z) ())
- 		(d () (x y z)))
- 		orderAs: #(b c a d)
- 		withRequired: #()
- 		toLoad: #()!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>denyButtonOn: (in category 'asserting') -----
- denyButtonOn: aString
- 	self deny: (self findButtonWithLabel: aString) getModelState.
- 	!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>falsehoodMethodSource (in category 'private') -----
- falsehoodMethodSource
- 	^ 'falsehood
- 	^ false'!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>testComment (in category 'testing') -----
- testComment
- 	self clickOnButton: '?'.
- 	self assertTextIs: ''.
- 	
- 	self clickOnListItem: self mockCategoryName.
- 	self assertTextIs: ''.
- 	
- 	self clickOnListItem: 'MCMockClassA'.
- 	self assertTextIs: self classAComment.!

Item was removed:
- ----- Method: MCWorkingCopyTest>>testSelectiveBackport (in category 'tests') -----
- testSelectiveBackport
- 	| inst base intermediate final |
- 	inst := self mockInstanceA.
- 	base :=  self snapshot.
- 	self assert: inst one = 1.
- 	self change: #one toReturn: 2.
- 	intermediate := self snapshot.
- 	self change: #two toReturn: 3.
- 	final := self snapshot.
- 	[workingCopy backportChangesTo: base info]
- 		on: MCChangeSelectionRequest
- 		do: [:e | | selected patch |
- 			patch := e patch.
- 			selected := patch operations select: [:ea | ea definition selector = #two].
- 			e resume: (MCPatch operations: selected)]. 
- 	self assert: inst one = 1.
- 	self assert: inst two = 3.
- 	self assert: workingCopy ancestry ancestors size = 1.
- 	self assert: workingCopy ancestry ancestors first = base info.
- 	self assert: workingCopy ancestry stepChildren size = 1.
- 	self assert: workingCopy ancestry stepChildren first = final info!

Item was removed:
- ----- Method: MCClassDefinitionTest>>testCannotLoad (in category 'as yet unclassified') -----
- testCannotLoad
- 	| d |
- 	d :=  self mockClass: 'MCMockClassC' super: 'NotAnObject'.
- 	self should: [d load] raise: Error.
- 	self deny: (Smalltalk hasClassNamed: 'MCMockClassC').!

Item was removed:
- MCRepositoryTest subclass: #MCDictionaryRepositoryTest
- 	instanceVariableNames: 'dict'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCTestCase>>assertSnapshot:matches: (in category 'asserting') -----
- assertSnapshot: actual matches: expected
- 	| diff |
- 	diff := actual patchRelativeToBase: expected.
- 	self assert: diff isEmpty
- !

Item was removed:
- TestCase subclass: #MCTestCase
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCPatchTest>>testPatchContents (in category 'as yet unclassified') -----
- testPatchContents
- 	self assert: patch operations size = 1.
- 	self assert: patch operations first isModification.
- 	self assert: patch operations first definition selector = #one.
- !

Item was removed:
- ----- Method: MCVersionTest>>testWithAllMissing (in category 'tests') -----
- testWithAllMissing
- 	self 
- 		assert: #withAllDependenciesDo: 
- 		orders: #(a ((b (d e)) (c missing))) 
- 		as: #(d e b a)!

Item was removed:
- ----- Method: MCSnapshotTest>>testCreation (in category 'tests') -----
- testCreation
- 	|d|
- 	d :=  self mockSnapshot definitions.
- 	self assert: (d anySatisfy: [:ea | ea isClassDefinition and: [ea className = #MCMockClassA]]).
- 	self assert: (d anySatisfy: [:ea | ea isMethodDefinition and: [ea selector = #mockClassExtension]]).
- 	self assert: (d allSatisfy: [:ea | ea isClassDefinition not or: [ea category endsWith: 'Mocks']]).
- 	!

Item was removed:
- ----- Method: MCMergingTest>>testMultiPackageMerge2 (in category 'tests') -----
- testMultiPackageMerge2
- 	| merger |
- 	conflicts := #().
- 	merger := MCThreeWayMerger new.
- 	merger addBaseSnapshot: (self snapshotWithElements: #(a1 b1)).
- 	merger applyPatch: ((self snapshotWithElements: #()) patchRelativeToBase: (self snapshotWithElements: #(a1))).
- 	merger applyPatch: ((self snapshotWithElements: #(a1 b1)) patchRelativeToBase: (self snapshotWithElements: #(b1))).
- 	merger conflicts do: [:ea | self handleConflict: ea].
- 	self assert: merger mergedSnapshot definitions hasElements: #(a1 b1).
- 	self assert: conflicts isEmpty!

Item was removed:
- ----- Method: MCChangeNotificationTest>>setUp (in category 'running') -----
- setUp
- 	workingCopy := MCWorkingCopy forPackage: self mockPackage.
- 	!

Item was removed:
- ----- Method: MCSerializationTest>>assertSnapshotsMatchWith: (in category 'asserting') -----
- assertSnapshotsMatchWith: writerClass
- 	| readerClass expected stream actual |
- 	readerClass := writerClass readerClass.
- 	expected := self mockSnapshot.
- 	stream := RWBinaryOrTextStream on: String new.
- 	(writerClass on: stream) writeSnapshot: expected.
- 	actual := readerClass snapshotFromStream: stream reset.
- 	self assertSnapshot: actual matches: expected.!

Item was removed:
- ----- Method: MCTestCase>>compileClass:source:category: (in category 'compiling') -----
- compileClass: aClass source: source category: category
- 	aClass compileSilently: source classified: category!

Item was removed:
- ----- Method: MCSerializationTest>>assertExtensionProvidedBy: (in category 'asserting') -----
- assertExtensionProvidedBy: aClass
- 	self shouldnt: [aClass readerClass extension] raise: Exception.!

Item was removed:
- ----- Method: MCSortingTest>>testSortOrder (in category 'tests') -----
- testSortOrder
- 	| aA aAm aB bA bB A B cA bAm cAm |
- 	aA := self methodNamed: #a class: #A meta: false.
- 	bA := self methodNamed: #b class: #A meta: false.
- 	cA := self methodNamed: #c class: #A meta: false.
- 	aAm := self methodNamed: #a class: #A meta: true.
- 	bAm := self methodNamed: #b class: #A meta: true.
- 	cAm := self methodNamed: #c class: #A meta: true.
- 	aB := self methodNamed: #a class: #B meta: false.
- 	bB := self methodNamed: #b class: #B meta: false.
- 	A := self classNamed: #A.
- 	B := self classNamed: #B.
- 	self assert: (self sortDefinitions: {aA. aAm. cAm. aB. bAm. bA. bB. A. cA. B})
- 					= {A. aAm. bAm. cAm. aA. bA. cA. B. aB.  bB}!

Item was removed:
- ----- Method: MCWorkingCopyTest>>testBackport (in category 'tests') -----
- testBackport
- 	| inst base final backported |
- 	inst := self mockInstanceA.
- 	base :=  self snapshot.
- 	self assert: inst one = 1.
- 	self change: #one toReturn: 2.
- 	self change: #two toReturn: 3.
- 	final := self snapshot.
- 	[workingCopy backportChangesTo: base info]
- 		on: MCChangeSelectionRequest
- 		do: [:e | e resume: e patch].
- 	self assert: inst one = 2.
- 	self assert: inst two = 3.
- 	self assert: workingCopy ancestry ancestors size = 1.
- 	self assert: workingCopy ancestry ancestors first = base info.
- 	self assert: workingCopy ancestry stepChildren size = 1.
- 	self assert: workingCopy ancestry stepChildren first = final info.
- 	backported := self snapshot.
- 	[workingCopy backportChangesTo: base info]
- 		on: MCChangeSelectionRequest
- 		do: [:e | e resume: e patch].
- 	self assert: workingCopy ancestry ancestors size = 1.
- 	self assert: workingCopy ancestry ancestors first = base info.
- 	self assert: workingCopy ancestry stepChildren size = 1.
- 	self assert: workingCopy ancestry stepChildren first = backported info.
- 	!

Item was removed:
- ----- Method: MCDependencySorterTest>>assertItems:orderAs:withRequired:toLoad:extraProvisions: (in category 'asserting') -----
- assertItems: anArray orderAs: depOrder withRequired: missingDeps toLoad: unloadableItems extraProvisions: provisions
- 	| order sorter items missing unloadable |
- 	items := anArray collect: [:ea | self itemWithSpec: ea].
- 	sorter := MCDependencySorter items: items.
- 	sorter addExternalProvisions: provisions.
- 	order := (sorter orderedItems collect: [:ea | ea name]) asArray.
- 	self assert: order = depOrder.
- 	missing := sorter externalRequirements.
- 	self assert: missing asSet = missingDeps asSet.
- 	unloadable := (sorter itemsWithMissingRequirements collect: [:ea | ea name]) asArray.
- 	self assert: unloadable asSet = unloadableItems asSet!

Item was removed:
- ----- Method: MCTestCase>>mockClassB (in category 'mocks') -----
- mockClassB
- 	^ Smalltalk at: #MCMockClassB!

Item was removed:
- ----- Method: MCDirectoryRepositoryTest>>addVersion: (in category 'as yet unclassified') -----
- addVersion: aVersion
- 	| file |
- 	file := FileStream newFileNamed: (directory fullNameFor: aVersion fileName).
- 	aVersion fileOutOn: file.
- 	file close.!

Item was removed:
- ----- Method: MCMergingTest>>assert:hasElements: (in category 'asserting') -----
- assert: aCollection hasElements: anArray
- 	self assert: (aCollection collect: [:ea | ea token]) asSet = anArray asSet!

Item was removed:
- ----- Method: MCMergingTest>>testMultipleConflicts (in category 'tests') -----
- testMultipleConflicts
- 	self assertMerge: #(a1 b3 c1)
- 				with: #(a1 b2 d1)
- 				base: #(a1 b1 c2)
- 				
- 				gives: #(a1 b3 d1)
- 				conflicts: #((removed c1) (b2 b3))
- !

Item was removed:
- ----- Method: MCRepositoryTest>>testAddAndLoad (in category 'tests') -----
- testAddAndLoad
- 	| node |
- 	node := self addVersionWithSnapshot: self snapshot1 name: 'rev1'.
- 	self assert: (self snapshotAt: node) = self snapshot1.
- !

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>classADefinitionString (in category 'private') -----
- classADefinitionString
- 	^ self mockClassA definition!

Item was removed:
- ----- Method: MCVersionTest>>versionFromTree: (in category 'building') -----
- versionFromTree: sexpr
- 	^ (self dependencyFromTree: sexpr) resolve!

Item was removed:
- ----- Method: MCTestCase>>mockMethod:class:source:meta: (in category 'mocks') -----
- mockMethod: aSymbol class: className source: sourceString meta: aBoolean
- 	^ MCMethodDefinition
- 		className: className
- 		classIsMeta: aBoolean
- 		selector:  aSymbol
- 		category: 'as yet unclassified'
- 		timeStamp: ''
- 		source: sourceString!

Item was removed:
- ----- Method: MCStReaderTest>>methodWithStyle (in category 'as yet unclassified') -----
- methodWithStyle
- 	^ '!!EventHandler methodsFor: ''copying'' stamp: ''tk 1/22/2001 17:39''!!
- veryDeepInner: deepCopier
- 	"ALL fields are weakly copied.  Can''t duplicate an object by duplicating a button that activates it.  See DeepCopier."
- 
- 	super veryDeepInner: deepCopier.
- 	"just keep old pointers to all fields"
- 	clickRecipient := clickRecipient.!!
- ]style[(25 108 10 111)f1b,f1,f1LDeepCopier Comment;,f1!! !!
- 
- '!

Item was removed:
- ----- Method: MCTestCase>>mockMessageString (in category 'mocks') -----
- mockMessageString
- 	^ 'A version generated for testing purposes.'!

Item was removed:
- ----- Method: MCAncestryTest>>testDescendants (in category 'tests') -----
- testDescendants
- 	| c1 a1 b3 q1 q2 c2 |
- 	c1 := self tree.
- 	a1 := self treeFrom: #(a1 (('00'))).
- 	b3 := self treeFrom: #(b3
- 				((b2
- 					((b1
- 						((b0
- 							(('00')))))))
- 				(a1
- 					(('00'))))).
- 	q1 := MCWorkingAncestry new addAncestor: a1.
- 	q2 := MCWorkingAncestry new addAncestor: q1.
- 	self assert: (q2 commonAncestorWith: b3) = a1.
- 	self assert: (b3 commonAncestorWith: q2) = a1.
- 	self assert: (q2 commonAncestorWith: c1) = a1.
- 	self assert: (c1 commonAncestorWith: q2) = a1.
- 	q1 addStepChild: c1.
- 	self assert: (q2 commonAncestorWith: c1) = q1.
- 	self assert: (c1 commonAncestorWith: q2) = q1.
- 	c2 := MCWorkingAncestry new addAncestor: c1.
- 	self assert: (q2 commonAncestorWith: c2) = q1.
- 	self assert: (c2 commonAncestorWith: q2) = q1.
- !

Item was removed:
- ----- Method: MCMczInstallerTest>>assertNoChange (in category 'as yet unclassified') -----
- assertNoChange
- 	| actual |
- 	actual := MCSnapshotResource takeSnapshot.
- 	diff := actual patchRelativeToBase: expected snapshot.
- 	self assert: diff isEmpty!

Item was removed:
- ----- Method: MCMczInstallerTest class>>isAbstract (in category 'as yet unclassified') -----
- isAbstract
- 	^ (Smalltalk hasClassNamed: #MczInstaller) not
- 		!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>allCategories (in category 'private') -----
- allCategories
- 	^ Array with: model extensionsCategory with: self mockCategoryName.!

Item was removed:
- ----- Method: MCVersionTest>>testPostOrder (in category 'tests') -----
- testPostOrder
- 	self 
- 		assert: #allDependenciesDo: 
- 		orders: #(a ((b (d e)) c)) 
- 		as: #(d e b c)!

Item was removed:
- ----- Method: MCRepositoryTest>>addVersion: (in category 'actions') -----
- addVersion: aVersion
- 	self subclassResponsibility !

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>testMethodSelected (in category 'testing') -----
- testMethodSelected
- 	self clickOnListItem: self mockCategoryName.
- 	self clickOnListItem: 'MCMockClassA'.
- 	self clickOnListItem: 'boolean'.
- 	self clickOnListItem: 'falsehood'.
- 	
- 	self assertAListMatches: self allCategories.
- 	self assertAListMatches: self definedClasses.
- 	self assertAListMatches: self classAProtocols.
- 	self assertAListMatches: self classABooleanMethods.
- 	self assertTextIs: self falsehoodMethodSource.!

Item was removed:
- MCTestCase subclass: #MCAncestryTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCRepositoryTest>>assertMissing: (in category 'asserting') -----
- assertMissing: aVersionInfo
- 	self assert: (repository versionWithInfo: aVersionInfo) isNil!

Item was removed:
- ----- Method: MCChangeNotificationTest>>tearDown (in category 'running') -----
- tearDown
- 	workingCopy unregister!

Item was removed:
- MCRepositoryTest subclass: #MCDirectoryRepositoryTest
- 	instanceVariableNames: 'directory'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCAncestryTest>>versionForName:in: (in category 'building') -----
- versionForName: name in: tree
- 	(tree name = name) ifTrue: [^ tree].
- 	
- 	tree ancestors do: [:ea | (self versionForName: name in: ea) ifNotNil: [:v | ^ v]].
- 	
- 	^ nil!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>morphsOfClass: (in category 'morphic') -----
- morphsOfClass: aMorphClass
- 	| morphs |
- 	morphs := OrderedCollection new.
- 	morph allMorphsDo: [:m | (m isKindOf: aMorphClass) ifTrue: [morphs add: m]].
- 	^ morphs!

Item was removed:
- ----- Method: MCInitializationTest class>>isAbstract (in category 'as yet unclassified') -----
- isAbstract
- 	^ (Smalltalk hasClassNamed: #MczInstaller) not
- 		!

Item was removed:
- ----- Method: MCClassDefinitionTest>>testComparison (in category 'as yet unclassified') -----
- testComparison
- 	| d1 d2 d3 d4 |
- 	d1 := self mockClass: 'A' super: 'X'.
- 	d2 := self mockClass: 'A' super: 'Y'.
- 	d3 := self mockClass: 'B' super: 'X'.
- 	d4 := self mockClass: 'B' super: 'X'.
- 	
- 	self assert: (d1 isRevisionOf: d2).
- 	self deny: (d1 isSameRevisionAs: d2).
- 
- 	self assert: (d3 isRevisionOf: d4).
- 	self assert: (d3 isSameRevisionAs: d4).
- 	
- 	self deny: (d1 isRevisionOf: d3).
- 	self deny: (d4 isRevisionOf: d2).!

Item was removed:
- MCTestCase subclass: #MCScannerTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCInitializationTest>>testWorkingCopy (in category 'as yet unclassified') -----
- testWorkingCopy
- 	MczInstaller storeVersionInfo: self mockVersion.
- 	MCWorkingCopy initialize.
- 	MCWorkingCopy allManagers
- 						detect: [:man | man package name = self mockPackage name]
- 						ifNone: [self assert: false]!

Item was removed:
- ----- Method: MCTestCase>>mockClassA (in category 'mocks') -----
- mockClassA
- 	^ Smalltalk at: #MCMockClassA!

Item was removed:
- ----- Method: MCStWriterTest>>testClassDefinitionB (in category 'testing') -----
- testClassDefinitionB
- 	writer visitClassDefinition: (self mockClassB asClassDefinition).
- 	self assertContentsOf: stream match: self expectedClassDefinitionB.
- 	!

Item was removed:
- ----- Method: MCWorkingCopyTest>>basicMerge: (in category 'actions') -----
- basicMerge: aVersion
- 	aVersion merge!

Item was removed:
- ----- Method: MCTestCase>>mockVersionInfo (in category 'mocks') -----
- mockVersionInfo
- 	^ self treeFrom: #(d ((b ((a))) (c)))!

Item was removed:
- MCTestCase subclass: #MCSerializationTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCTestCase>>commentStampForClass: (in category 'mocks') -----
- commentStampForClass: name
- 	^ 'tester-', name,  ' 1/1/2000 00:00'!

Item was removed:
- ----- Method: MCStReaderTest>>commentWithoutStyle (in category 'as yet unclassified') -----
- commentWithoutStyle
- 	^ '
- CharacterScanner subclass: #CanvasCharacterScanner
- 	instanceVariableNames: ''canvas fillBlt foregroundColor runX lineY ''
- 	classVariableNames: ''''
- 	poolDictionaries: ''''
- 	category: ''Morphic-Support''!!
- 
- !!CanvasCharacterScanner commentStamp: ''<historical>'' prior: 0!!
- A displaying scanner which draws its output to a Morphic canvas.!!
- 
- !!CanvasCharacterScanner methodsFor: ''stop conditions'' stamp: ''ar 12/15/2001 23:27''!!
- setStopConditions
- 	"Set the font and the stop conditions for the current run."
- 
- 	self setFont.
- 	stopConditions
- 		at: Space asciiValue + 1
- 		put: (alignment = Justified ifTrue: [#paddedSpace])!! !!'!

Item was removed:
- ----- Method: MCClassDefinitionTest>>classAComment (in category 'as yet unclassified') -----
- classAComment
- 	^ self class classAComment!

Item was removed:
- ----- Method: MCMczInstallerTest>>assertVersionInfoPresent (in category 'as yet unclassified') -----
- assertVersionInfoPresent
- 	| dict info |
- 	dict := MczInstaller versionInfo at: self mockPackage name.
- 	info := expected info.
- 	self assertDict: dict matchesInfo: info.!

Item was removed:
- ----- Method: MCMergingTest>>testSubtractiveConflictlessMerge (in category 'tests') -----
- testSubtractiveConflictlessMerge
- 	self assertMerge: #(a1 b1)
- 				with: #()
- 				base: #(a1)
- 				
- 				gives: #(b1)
- 				conflicts: #()!

Item was removed:
- ----- Method: MCWorkingCopyTest>>merge: (in category 'actions') -----
- merge: aVersion
- 	[[self basicMerge: aVersion]
- 		on: MCMergeResolutionRequest do: [:n | n resume: true]]
- 			on: MCNoChangesException do: [:n | ]!

Item was removed:
- ----- Method: MCTestCase>>mockOverrideMethodCategory (in category 'mocks') -----
- mockOverrideMethodCategory
- 	^ self mockExtensionMethodCategory, '-override'!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>assertButtonOn: (in category 'asserting') -----
- assertButtonOn: aString
- 	self assert: (self findButtonWithLabel: aString) getModelState.
- 	!

Item was removed:
- ----- Method: MCWorkingCopyTest>>testRepeatedMerge (in category 'tests') -----
- testRepeatedMerge
- 	| base mother1 mother2 inst |
- 
- 	base :=  self snapshot.
- 	self change: #one toReturn: 2.
- 	mother1 :=  self snapshot.
- 	self change: #two toReturn: 3.
- 	mother2 :=  self snapshot.	
- 	
- 	self load: base.
- 	self change: #truth toReturn: false.
- 	self snapshot.
- 
- 	inst := self mockInstanceA.
- 	self assert: inst one = 1.
- 	self assert: inst two = 2.	
- 
- 	self merge: mother1.
- 	self assert: inst one = 2.
- 	self assert: inst two = 2.	
- 	
- 	self change: #one toReturn: 7.
- 	self assert: inst one = 7.
- 	self assert: inst two = 2.
- 	
- 	self shouldnt: [self merge: mother2] raise: Error.
- 	self assert: inst one = 7.
- 	self assert: inst two = 3.!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>classAComment (in category 'private') -----
- classAComment
- 	^ self mockClassA organization classComment.!

Item was removed:
- ----- Method: MCSortingTest>>sortKeyFor: (in category 'building') -----
- sortKeyFor: aDefinition
- 	^ String streamContents:
- 		[:s |
- 		aDefinition description
- 			do: [:ea | s nextPutAll: ea asString]
- 			separatedBy: [s nextPut: $.]]!

Item was removed:
- ----- Method: MCSortingTest>>classNamed: (in category 'building') -----
- classNamed: aSymbol
- 	^ MCClassDefinition
- 		name: aSymbol
- 		superclassName: #Object
- 		category: ''
- 		instVarNames: #()
- 		comment: ''!

Item was removed:
- ----- Method: MCMethodDefinitionTest>>testComparison (in category 'testing') -----
- testComparison
- 	|d1 d2 d3 d4 d5 |
- 	d1 := self mockMethod: #one class: 'A' source: '1' meta: false.
- 	d2 := self mockMethod: #one class: 'A' source: '2' meta: false.
- 	d3 := self mockMethod: #one class: 'A' source: '1' meta: true.
- 	d4 := self mockMethod: #two class: 'A' source: '1' meta: false.
- 	d5 := self mockMethod: #two class: 'A' source: '1' meta: false.
- 	
- 	self assert: (d1 isRevisionOf: d2).
- 	self deny: (d1 isSameRevisionAs: d2).
- 	
- 	self deny: (d1 isRevisionOf: d3).
- 	self deny: (d1 isRevisionOf: d4).
- 	
- 	self assert: (d4 isSameRevisionAs: d5).!

Item was removed:
- ----- Method: MCRepositoryTest>>assertVersionInfos: (in category 'asserting') -----
- assertVersionInfos: aCollection
- 	self assert: repository allVersionInfos asSet = aCollection asSet!

Item was removed:
- ----- Method: MCAncestryTest>>twoPersonTree (in category 'building') -----
- twoPersonTree
- 	^ self treeFrom:
- 		#(c1
- 			((a4
- 				((a1)
- 				(b3
- 					((b2
- 						((a1)))))))
- 			(b5
- 				((b2
- 					((a1)))))))!

Item was removed:
- ----- Method: MCClassDefinitionTest>>creationMessage (in category 'as yet unclassified') -----
- creationMessage
- 	^ MessageSend
- 		receiver: MCClassDefinition
- 		selector: #name:superclassName:category:instVarNames:classVarNames:poolDictionaryNames:classInstVarNames:type:comment:commentStamp:!

Item was removed:
- MCTestCase subclass: #MCWorkingCopyTest
- 	instanceVariableNames: 'savedInitials workingCopy repositoryGroup versions versions2'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>listMorphs (in category 'morphic') -----
- listMorphs
- 	^ self morphsOfClass: PluggableListMorph!

Item was removed:
- ----- Method: MCRepositoryTest>>testLoadMissingNode (in category 'tests') -----
- testLoadMissingNode
- 	| node |
- 	node := MCVersionInfo new.
- 	self assertMissing: node!

Item was removed:
- ----- Method: MCMczInstallerTest>>testInstallFromStream (in category 'as yet unclassified') -----
- testInstallFromStream
- 	| stream |
- 	stream := RWBinaryOrTextStream on: String new.
- 	MCMczWriter fileOut: expected on: stream.
- 	MczInstaller installStream: stream reset.
- 	self assertNoChange.
- 	self assertVersionInfoPresent.
- 	!

Item was removed:
- ----- Method: MCVersionTest>>testAllAvailablePostOrder (in category 'tests') -----
- testAllAvailablePostOrder
- 	self 
- 		assert: #allAvailableDependenciesDo: 
- 		orders: #(a ((b (d e)) c)) 
- 		as: #(d e b c)!

Item was removed:
- ----- Method: MCSerializationTest>>assertDependenciesMatchWith: (in category 'asserting') -----
- assertDependenciesMatchWith: writerClass
- 	| stream readerClass expected actual |
- 	readerClass := writerClass readerClass.
- 	expected := self mockVersionWithDependencies.
- 	stream := RWBinaryOrTextStream on: String new.
- 	writerClass fileOut: expected on: stream.
- 	actual := (readerClass on: stream reset) dependencies.
- 	self assert: actual = expected dependencies.!

Item was removed:
- ----- Method: MCStReaderTest>>testMethodWithStyle (in category 'as yet unclassified') -----
- testMethodWithStyle
- 	| reader |
- 	reader := MCStReader on: self methodWithStyle readStream.
- 	self assert: reader definitions first isMethodDefinition.!

Item was removed:
- ----- Method: MCTestCase>>mockDependencies (in category 'mocks') -----
- mockDependencies
- 	^ Array with: (MCVersionDependency package: self mockEmptyPackage info: (self mockVersionInfo: 'x'))!

Item was removed:
- ----- Method: MCDependencySorterTest>>testCycle (in category 'tests') -----
- testCycle
- 	self assertItems: #(
- 		(a (x) (y))
- 		(b (y) (x)))
- 	orderAs: #()
- 	withRequired: #()
- 	toLoad: #(a b)	!

Item was removed:
- ----- Method: MCOrganizationTest>>testReorderingWithRemovals (in category 'as yet unclassified') -----
- testReorderingWithRemovals
- 	|dec cats newCats |
- 	dec := MCOrganizationDefinition categories: #(A B C).
- 	cats := #(X Y B Z C A Q).
- 	newCats := dec reorderCategories: cats original: #(Y B C A Q).
- 	self assert: newCats asArray = #(X A B C Z).!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>testClassSideClassSelected (in category 'testing') -----
- testClassSideClassSelected
- 	self clickOnButton: 'class'.
- 	self selectMockClassA.
- 	
- 	self assertAListMatches: self allCategories.
- 	self assertAListMatches: self definedClasses.
- 	self assertAListMatches: self classAClassProtocols.
- 	self denyAListIncludesAnyOf: self allMethods.
- 	self assertTextIs: self classADefinitionString.!

Item was removed:
- ----- Method: MCStWriterTest>>testClassDefinitionA (in category 'testing') -----
- testClassDefinitionA
- 	writer visitClassDefinition: (self mockClassA asClassDefinition).
- 	self assertContentsOf: stream match: self expectedClassDefinitionA.
- 	stream reset.
- 	2 timesRepeat: [self assertChunkIsWellFormed: stream nextChunk]!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>clickOnButton: (in category 'simulating') -----
- clickOnButton: aString
- 	(self findButtonWithLabel: aString) performAction.!

Item was removed:
- MCTestCase subclass: #MCSnapshotTest
- 	instanceVariableNames: 'snapshot'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCTestCase>>assertVersion:matches: (in category 'asserting') -----
- assertVersion: actual matches: expected
- 	self assertPackage: actual package matches: expected package.	
- 	self assertVersionInfo: actual info matches: expected info.
- 	self assertSnapshot: actual snapshot matches: expected snapshot.!

Item was removed:
- ----- Method: MCTestCase>>mockPackage (in category 'mocks') -----
- mockPackage
- 	^ MCSnapshotResource mockPackage!

Item was removed:
- ----- Method: MCMergingTest>>testSimultaneousModification (in category 'tests') -----
- testSimultaneousModification
- 	self assertMerge: #(a2)
- 				with: #(a3)
- 				base: #(a1)
- 				
- 				gives: #(a3)
- 				conflicts: #((a3 a2)).!

Item was removed:
- ----- Method: MCWorkingCopyTest>>load: (in category 'actions') -----
- load: aVersion
- 	aVersion load!

Item was removed:
- ----- Method: MCFileInTest>>assertInitializersCalled (in category 'testing') -----
- assertInitializersCalled
- 	| cvar |
- 	cvar := self mockClassA cVar.
- 	self assert: cvar = #initialized!

Item was removed:
- ----- Method: MCStWriterTest>>testMethodDefinitionWithBangs (in category 'testing') -----
- testMethodDefinitionWithBangs
- 	writer visitMethodDefinition: (MethodReference 
- 									class: self class 
- 									selector: #methodWithBangs) asMethodDefinition.
- 	self assertContentsOf: stream match: self expectedMethodDefinitionWithBangs.
- 	stream reset.
- 	self assert: stream nextChunk isAllSeparators.
- 	self assertChunkIsWellFormed: stream nextChunk.
- 	self assertMethodChunkIsWellFormed: stream nextChunk.
- 	self assert: stream nextChunk isAllSeparators !

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>denyAListHasSelection: (in category 'asserting') -----
- denyAListHasSelection: aString
- 	| found |
- 	found := true.
- 	self listMorphs 
- 			detect: [:m | m selection = aString]
- 			ifNone: [found := false].
- 	self deny: found.!

Item was removed:
- MCTestCase subclass: #MCInitializationTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCDirectoryRepositoryTest>>tearDown (in category 'as yet unclassified') -----
- tearDown
- 	self directory recursiveDelete!

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

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>testFourColumns (in category 'testing') -----
- testFourColumns
- 	self assert: self listMorphs size = 4.!

Item was removed:
- ----- Method: MCChangeNotificationTest>>testCoreMethodModified (in category 'tests') -----
- testCoreMethodModified
- 	| event |
- 	workingCopy modified: false.
- 	event := self modifiedEventFor: #one ofClass: self mockClassA.
- 	MCWorkingCopy methodModified: event.
- 	self assert: workingCopy modified!

Item was removed:
- ----- Method: MCRepositoryTest>>addVersionWithSnapshot:name: (in category 'actions') -----
- addVersionWithSnapshot: aSnapshot name: aString
- 	| version |
- 	version := self versionWithSnapshot: aSnapshot name: aString.
- 	self addVersion: version.
- 	^ version info!

Item was removed:
- ----- Method: MCAncestryTest>>assertCommonAncestorOf:and:is:in: (in category 'asserting') -----
- assertCommonAncestorOf: leftName and: rightName is: ancestorName in: tree
- 	self assertCommonAncestorOf: leftName and: rightName in: (Array with: ancestorName) in: tree!

Item was removed:
- ----- Method: MCSnapshotResource>>definitions (in category 'as yet unclassified') -----
- definitions
- 	^ snapshot definitions!

Item was removed:
- ----- Method: MCDictionaryRepositoryTest>>dictionary (in category 'as yet unclassified') -----
- dictionary
- 	^ dict ifNil: [dict := Dictionary new]!

Item was removed:
- ----- Method: MCClassDefinitionTest class>>classAComment (in category 'as yet unclassified') -----
- classAComment
- 	^ 'This is a mock class. The Monticello tests manipulated it to simulate a developer modifying code in the image.'!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>allMethods (in category 'private') -----
- allMethods
- 	^ MCSnapshotResource current definitions
- 		select: [:def | def isMethodDefinition]
- 		thenCollect: [:def | def selector]		!

Item was removed:
- ----- Method: MCAncestryTest>>tree (in category 'building') -----
- tree
- 	^ self treeFrom:
- 		#(c1
- 			((e2
- 				((e1
- 					((a1
- 						(('00')))))))
- 			(a2
- 				((a1
- 					(('00')))))
- 			(b3
- 				((b2
- 					((b1
- 						((b0
- 							(('00')))))))
- 				(a1
- 					(('00')))))
- 			(d1)))!

Item was removed:
- ----- Method: MCFileInTest>>assertFileOutFrom:canBeFiledInWith: (in category 'testing') -----
- assertFileOutFrom: writerClass canBeFiledInWith: aBlock
- 	(writerClass on: stream) writeSnapshot: self mockSnapshot.
- 	self alterInitialState.
- 	self assertSuccessfulLoadWith: aBlock.
- 	self mockPackage unload.
- 	self assertSuccessfulLoadWith: aBlock.
- !

Item was removed:
- TestResource subclass: #MCSnapshotResource
- 	instanceVariableNames: 'snapshot'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCStWriterTest>>methodWithBangs (in category 'testing') -----
- methodWithBangs
- 	^ '
- 	^ ReadStream on: 
- ''MCRevisionInfo packageName: ''MonticelloCompatibilityTest''!!!!
- MCOrganizationDeclaration categories: 
-   #(
-   ''Monticello-Mocks'')!!!!
- 
- MCClassDeclaration
-   name: #MCMockClassD
-   superclassName: #Object
-   category: #''Monticello-Mocks''
-   instVarNames: #()
-   comment: ''''!!!!
- 
- MCMethodDeclaration className: #MCMockClassD selector: #one category: #''as yet unclassified'' timeStamp: ''cwp 7/8/2003 21:21'' source: 
- ''one
- 	^ 1''!!!!
- ''
- '
- !

Item was removed:
- ----- Method: MCDirectoryRepositoryTest>>directory (in category 'as yet unclassified') -----
- directory
- 	directory ifNil:
- 		[directory := FileDirectory default directoryNamed: 'mctest'.
- 		directory assureExistence].
- 	^ directory!

Item was removed:
- ----- Method: MCWorkingCopyTest>>clearPackageCache (in category 'running') -----
- clearPackageCache
- 	| dir |
- 	dir := MCCacheRepository default directory.
- 	(dir fileNamesMatching: 'MonticelloMocks*') do: [:ea | dir deleteFileNamed: ea].
- 	(dir fileNamesMatching: 'MonticelloTest*') do: [:ea | dir deleteFileNamed: ea].
- 	(dir fileNamesMatching: 'rev*') do: [:ea | dir deleteFileNamed: ea].
- 	(dir fileNamesMatching: 'foo-*') do: [:ea | dir deleteFileNamed: ea].
- 	(dir fileNamesMatching: 'foo2-*') do: [:ea | dir deleteFileNamed: ea].!

Item was removed:
- ----- Method: MCMergingTest>>testComplexConflictlessMerge (in category 'tests') -----
- testComplexConflictlessMerge
- 	self 
- 		assertMerge: #(a1 b1 d1)
- 				with: #(a2 c1)
- 				base: #(a1 c1 d1)
- 				
- 				gives: #(a2 b1)
- 				conflicts: #()!

Item was removed:
- ----- Method: MCRepositoryTest>>snapshotAt: (in category 'accessing') -----
- snapshotAt: aVersionInfo
- 	^ (repository versionWithInfo: aVersionInfo) snapshot!

Item was removed:
- ----- Method: MCScannerTest>>test6 (in category 'tests') -----
- test6
- 	self should: [MCScanner scan: '(a b' readStream] raise: Error!

Item was removed:
- ----- Method: MCDictionaryRepositoryTest>>deleteNode: (in category 'as yet unclassified') -----
- deleteNode: aNode
- 	dict removeKey: aNode!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>clickOnListItem: (in category 'simulating') -----
- clickOnListItem: aString
- 	| listMorph |
- 	listMorph := self findListContaining: aString.
- 	listMorph changeModelSelection: (listMorph getList indexOf: aString).!

Item was removed:
- ----- Method: MCRepositoryTest>>snapshot2 (in category 'building') -----
- snapshot2
- 	^ (MCSnapshot fromDefinitions: (Array with: (MCOrganizationDefinition categories: #('x'))))!

Item was removed:
- MCTestCase subclass: #MCVersionTest
- 	instanceVariableNames: 'version visited'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCMergingTest>>testAdditiveConflictlessMerge (in category 'tests') -----
- testAdditiveConflictlessMerge
- 	self
- 		assertMerge: #(a1 b1)
- 				with: #(a1 c1)
- 				base: #(a1)
- 			
- 				gives: #(a1 b1 c1)
- 				conflicts: #()!

Item was removed:
- ----- Method: MCMergingTest>>testLocalModifyRemoteRemove (in category 'tests') -----
- testLocalModifyRemoteRemove
- 	self assertMerge: #(a2 b1)
- 				with: #(b1)
- 				base: #(a1 b1)
- 				
- 				gives: #(b1)
- 				conflicts: #((removed a2)).
- 				
- 	self assertMerge: #(a1 b1)
- 				with: #(b1)
- 				base: #(a2 b1)
- 				
- 				gives: #(b1)
- 				conflicts: #((removed a1)).!

Item was removed:
- ----- Method: MCMergingTest>>testMultiPackageMerge (in category 'tests') -----
- testMultiPackageMerge
- 	| merger |
- 	conflicts := #().
- 	merger := MCThreeWayMerger new.
- 	merger addBaseSnapshot: (self snapshotWithElements: #(a1 b1)).
- 	merger applyPatch: ((self snapshotWithElements: #()) patchRelativeToBase: (self snapshotWithElements: #(a1))).
- 	merger applyPatch: ((self snapshotWithElements: #(a2 b1)) patchRelativeToBase: (self snapshotWithElements: #(b1))).
- 	merger conflicts do: [:ea | self handleConflict: ea].
- 	self assert: merger mergedSnapshot definitions hasElements: #(a2 b1).
- 	self assert: conflicts isEmpty!

Item was removed:
- ----- Method: MCPackageTest>>tearDown (in category 'running') -----
- tearDown
- 	self mockSnapshot install!

Item was removed:
- MCTestCase subclass: #MCPackageTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCPackageTest>>testUnload (in category 'tests') -----
- testUnload
- 	| mock |
- 	self mockPackage unload.
- 	self deny: (Smalltalk hasClassNamed: #MCMockClassA).
- 	self deny: (MCSnapshotTest includesSelector: #mockClassExtension).
- 
- 	mock := (Smalltalk at: #MCMock).
- 	self assert: (mock subclasses detect: [:c | c name = #MCMockClassA] ifNone: []) isNil!

Item was removed:
- ----- Method: MCChangeNotificationTest>>testForeignMethodModified (in category 'tests') -----
- testForeignMethodModified
- 	| event |
- 	workingCopy modified: false.
- 	event := self modifiedEventFor: #foreignMethod ofClass: self class.
- 	MCWorkingCopy methodModified: event.
- 	self deny: workingCopy modified!

Item was removed:
- ----- Method: MCSnapshotBrowserTest class>>resources (in category 'as yet unclassified') -----
- resources
- 	^ Array with: MCSnapshotResource!

Item was removed:
- ----- Method: MCPatchTest>>setUp (in category 'as yet unclassified') -----
- setUp
- 	|rev1 rev2|
- 	rev1 :=  MCSnapshotResource takeSnapshot.
- 	self change: #one toReturn: 2.
- 	rev2 :=  MCSnapshotResource takeSnapshot.
- 	patch := rev2 patchRelativeToBase: rev1.
- 	self change: #one toReturn: 1.!

Item was removed:
- MCTestCase subclass: #MCMethodDefinitionTest
- 	instanceVariableNames: 'navigation isModified'
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>testAnnotationPane (in category 'testing') -----
- testAnnotationPane
- 	| oldPref |
- 	oldPref := Preferences annotationPanes.
- 
- 	Preferences disable: #annotationPanes.
- 	morph := model buildWindow.
- 	self assert: (self morphsOfClass: TextMorph) size = 1.
- 
- 	Preferences enable: #annotationPanes.
- 	morph := model buildWindow.
- 	self assert: (self morphsOfClass: TextMorph) size = 2.
- 
- 	Preferences setPreference: #annotationPanes toValue: oldPref!

Item was removed:
- ----- Method: MCMethodDefinitionTest>>testPartiallyRevertOverrideMethod (in category 'testing') -----
- testPartiallyRevertOverrideMethod
- 	| definition |
- 	self class compile: 'override ^ 2' classified: '*foobarbaz'.
- 	self class compile: 'override ^ 3' classified: self mockOverrideMethodCategory.
- 	self class compile: 'override ^ 4' classified: self mockOverrideMethodCategory.
- 	definition := (MethodReference class: self class selector: #override) asMethodDefinition.
- 	self assert: definition isOverrideMethod.
- 	self assert: self override = 4.
- 	definition unload.
- 	self assert: self override = 2.
- 	self assert: (MethodReference class: self class selector: #override) category = '*foobarbaz'.
- 	!

Item was removed:
- ----- Method: MCAncestryTest>>assertPathTo:is: (in category 'asserting') -----
- assertPathTo: aSymbol is: anArray
- 	self
- 		assertNamesOf: (self tree allAncestorsOnPathTo: (self treeFrom: {aSymbol}))
- 		are: anArray!

Item was removed:
- ----- Method: MCWorkingCopyTest>>testAncestorMerge (in category 'tests') -----
- testAncestorMerge
- 	| base revA revB revC |
- 
- 	base := self snapshot.
- 	self change: #a toReturn: 'a1'.
- 	revA :=  self snapshot.
- 	self change: #b toReturn: 'b1'.
- 	revB :=  self snapshot.	
- 	self change: #c toReturn: 'c1'.
- 	revC :=  self snapshot.	
- 
- 	self should: [self basicMerge: revA] raise: MCNoChangesException.
- 	!

Item was removed:
- ----- Method: MCWorkingCopyTest>>snapshot (in category 'actions') -----
- snapshot
- 	| version |
- 	[version := workingCopy newVersion]
- 		on: MCVersionNameAndMessageRequest
- 		do: [:n | n resume: (Array with: n suggestedName with: '')].
- 	versions at: version info put: version.
- 	^ version!

Item was removed:
- ----- Method: MCInitializationTest>>tearDown (in category 'as yet unclassified') -----
- tearDown
- 	(MCWorkingCopy forPackage: self mockPackage) unregister!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>selectMockClassA (in category 'selecting') -----
- selectMockClassA
- 	self clickOnListItem: self mockCategoryName.
- 	self clickOnListItem: 'MCMockClassA'.
- 	!

Item was removed:
- ----- Method: MCSnapshotResource>>snapshot (in category 'as yet unclassified') -----
- snapshot
- 	^ snapshot!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>classAClassProtocols (in category 'private') -----
- classAClassProtocols
- 	^ self protocolsForClass: self mockClassA class.!

Item was removed:
- ----- Method: MCWorkingCopyTest>>testRedundantMerge (in category 'tests') -----
- testRedundantMerge
- 	| base |
- 	base :=  self snapshot.
- 	self merge: base.
- 	self shouldnt: [self merge: base] raise: Error.!

Item was removed:
- ----- Method: MCTestCase class>>resources (in category 'as yet unclassified') -----
- resources
- 	^ Array with: MCSnapshotResource!

Item was removed:
- ----- Method: MCFileInTest>>setUp (in category 'running') -----
- setUp
- 	expected := self mockSnapshot.
- 	stream := RWBinaryOrTextStream on: String new.!

Item was removed:
- ----- Method: MCTestCase>>mockCategoryName (in category 'mocks') -----
- mockCategoryName
- 	^ 'Monticello-Mocks'!

Item was removed:
- ----- Method: MCDependencySorterTest>>assertItems:orderAs:withRequired:toLoad: (in category 'asserting') -----
- assertItems: anArray orderAs: depOrder withRequired: missingDeps toLoad: unloadableItems
- 	self assertItems: anArray orderAs: depOrder withRequired: missingDeps  toLoad: unloadableItems  extraProvisions: #()!

Item was removed:
- ----- Method: MCSnapshotTest>>setUp (in category 'running') -----
- setUp
- 	snapshot :=  self mockSnapshot.!

Item was removed:
- ----- Method: MCSortingTest>>methodNamed:class:meta: (in category 'building') -----
- methodNamed: aSymbol class: className meta: aBoolean
- 	^ MCMethodDefinition
- 		className: className
- 		classIsMeta: aBoolean
- 		selector: aSymbol
- 		category: ''
- 		timeStamp: ''
- 		source: ''!

Item was removed:
- ----- Method: MCVersionTest>>testAllUnresolved (in category 'tests') -----
- testAllUnresolved
- 	self 
- 		assert: #allDependenciesDo:ifUnresolved: 
- 		orders: #(a ((b (d e)) (c missing)))
- 		as: #(d e b)
- 		unresolved: #(c)!

Item was removed:
- ----- Method: MCVersionTest>>dependencyFromTree: (in category 'building') -----
- dependencyFromTree: sexpr
- 	^ MCMockDependency fromTree: sexpr!

Item was removed:
- ----- Method: MCDependencySorterTest>>testSimpleOrdering (in category 'tests') -----
- testSimpleOrdering
- 	self assertItems: #((a (x) ())
- 								 (c () (y))
- 								 (b (y) (x)))
- 		orderAs: #(a b c)
- 		withRequired: #()
- 		toLoad: #()!

Item was removed:
- ----- Method: MCAncestryTest>>testLinearPath (in category 'tests') -----
- testLinearPath
- 	self assertPathTo: #b1 is: #(b3 b2)!

Item was removed:
- ----- Method: MCScannerTest>>test5 (in category 'tests') -----
- test5
- 	self assertScans: #((a) b)!

Item was removed:
- ----- Method: MCClassDefinitionTest>>testEquals (in category 'as yet unclassified') -----
- testEquals
- 	| a b |
- 	a := self mockClass: 'ClassA' super: 'SuperA'.
- 	b := self mockClass: 'ClassA' super: 'SuperA'.
- 	self assert: a = b!

Item was removed:
- ----- Method: MCStWriterTest>>assertContentsOf:match: (in category 'asserting') -----
- assertContentsOf: strm match: expected 
- 	| actual |
- 	actual := strm contents.
- 	self assert: actual size = expected size.
- 	actual with: expected do: [:a :e | self assert: a = e]!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>testClassSelected (in category 'testing') -----
- testClassSelected
- 	self selectMockClassA.
- 	
- 	self assertAListMatches: self allCategories.
- 	self assertAListMatches: self definedClasses.
- 	self assertAListMatches: self classAProtocols.
- 	self denyAListIncludesAnyOf: self allMethods.
- 	self assertTextIs: self classADefinitionString.!

Item was removed:
- ----- Method: MCRepositoryTest>>snapshot1 (in category 'building') -----
- snapshot1
- 	^ (MCSnapshot fromDefinitions: (Array with: (MCOrganizationDefinition categories: #('y'))))!

Item was removed:
- ----- Method: MCTestCase>>commentForClass: (in category 'mocks') -----
- commentForClass: name
- 	^ 'This is a comment for ', name!

Item was removed:
- ----- Method: MCAncestryTest>>testCommonAncestors (in category 'tests') -----
- testCommonAncestors
- 	self assertCommonAncestorOf: #a2 and: #e2 is: #a1 in: self tree.
- 	self assertCommonAncestorOf: #e2 and: #b3 is: #a1 in: self tree.
- 	self assertCommonAncestorOf: #b2 and: #e2 is: #'00' in: self tree.
- 	
- 	self assertCommonAncestorOf: #a4 and: #b5 in: #(b2 a1) in: self twoPersonTree.
- 	self assertCommonAncestorOf: #b5 and: #b3 is: #b2 in: self twoPersonTree.
- 	self assertCommonAncestorOf: #b2 and: #a4 is: #b2 in: self twoPersonTree.
- 	self assertCommonAncestorOf: #b2 and: #b2 is: #b2 in: self twoPersonTree.
- 	self assertCommonAncestorOf: #b2 and: #a1 is: #a1 in: self twoPersonTree.
- 	self assertCommonAncestorOf: #a1 and: #b2 is: #a1 in: self twoPersonTree.!

Item was removed:
- ----- Method: MCRepositoryTest>>saveSnapshot:named: (in category 'actions') -----
- saveSnapshot: aSnapshot named: aString
- 	| version |
- 	version := self versionWithSnapshot: aSnapshot name: aString.
- 	repository storeVersion: version.
- 	^ version info
- 	!

Item was removed:
- ----- Method: MCClassDefinitionTest class>>restoreClassAComment (in category 'as yet unclassified') -----
- restoreClassAComment
- 	Smalltalk 
- 		at: #MCMockClassA 
- 		ifPresent: [:a | a classComment: self classAComment stamp: self classACommentStamp]!

Item was removed:
- ----- Method: MCMergingTest>>snapshotWithElements: (in category 'emulating') -----
- snapshotWithElements: anArray
- 	^ MCSnapshot
- 		fromDefinitions: (anArray collect: [:t | self mockToken: t])!

Item was removed:
- ----- Method: MCWorkingCopyTest>>testSnapshotAndLoad (in category 'tests') -----
- testSnapshotAndLoad
- 	| base inst |
- 	inst := self mockInstanceA.
- 	base :=  self snapshot.
- 	self change: #one toReturn: 2.
- 	self assert: inst one = 2.
- 	self load: base.
- 	self assert: inst one = 1.!

Item was removed:
- ----- Method: MCVersionTest>>testAllMissing (in category 'tests') -----
- testAllMissing
- 	self 
- 		assert: #allDependenciesDo: 
- 		orders: #(a ((b (d e)) (c missing))) 
- 		as: #(d e b)!

Item was removed:
- ----- Method: MCVersionTest>>setUp (in category 'running') -----
- setUp
- 	visited := OrderedCollection new.!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>assertButtonExists: (in category 'asserting') -----
- assertButtonExists: aString
- 	self buttonMorphs detect: [:m | m label = aString] ifNone: [self assert: false].
- 				!

Item was removed:
- ----- Method: MCDirectoryRepositoryTest>>setUp (in category 'as yet unclassified') -----
- setUp
- 	repository := MCDirectoryRepository new directory: self directory!

Item was removed:
- ----- Method: MCClassDefinitionTest>>testDefinitionString (in category 'as yet unclassified') -----
- testDefinitionString
- 	| d |
- 	d := self mockClassA asClassDefinition.
- 	self assert: d definitionString = self mockClassA definition.!

Item was removed:
- ----- Method: MCStWriterTest>>testMethodDefinition (in category 'testing') -----
- testMethodDefinition
- 	writer visitMethodDefinition: (MethodReference class: self mockClassA selector: #one) 									asMethodDefinition.
- 	self assertContentsOf: stream match: self expectedMethodDefinition.
- 	stream reset.
- 	self assert: stream nextChunk isAllSeparators.
- 	self assertChunkIsWellFormed: stream nextChunk.
- 	self assertMethodChunkIsWellFormed: stream nextChunk.
- 	self assert: stream nextChunk isAllSeparators !

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>findListContaining: (in category 'morphic') -----
- findListContaining: aString
- 	^ self listMorphs detect: [:m | m getList includes: aString]!

Item was removed:
- ----- Method: MCPatchTest>>tearDown (in category 'as yet unclassified') -----
- tearDown
- 	self restoreMocks!

Item was removed:
- ----- Method: MCStWriterTest>>expectedMethodDefinitionWithBangs (in category 'data') -----
- expectedMethodDefinitionWithBangs
- 	^ '
- !!MCStWriterTest methodsFor: ''testing'' stamp: ''cwp 8/9/2003 14:55''!!
- methodWithBangs
- 	^ ''
- 	^ ReadStream on: 
- ''''MCRevisionInfo packageName: ''''MonticelloCompatibilityTest''''!!!!!!!!
- MCOrganizationDeclaration categories: 
-   #(
-   ''''Monticello-Mocks'''')!!!!!!!!
- 
- MCClassDeclaration
-   name: #MCMockClassD
-   superclassName: #Object
-   category: #''''Monticello-Mocks''''
-   instVarNames: #()
-   comment: ''''''''!!!!!!!!
- 
- MCMethodDeclaration className: #MCMockClassD selector: #one category: #''''as yet unclassified'''' timeStamp: ''''cwp 7/8/2003 21:21'''' source: 
- ''''one
- 	^ 1''''!!!!!!!!
- ''''
- ''
- !! !!
- '!

Item was removed:
- ----- Method: MCTestCase>>assertVersionInfo:matches: (in category 'asserting') -----
- assertVersionInfo: actual matches: expected
- 	self assert: actual name = expected name.
- 	self assert: actual message = expected message.
- 	self assert: actual ancestors size = expected ancestors size.
- 	actual ancestors with: expected ancestors do: [:a :e | self assertVersionInfo: a matches: e]
- 	!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>testProtocolSelected (in category 'testing') -----
- testProtocolSelected
- 	self clickOnListItem: self mockCategoryName.
- 	self clickOnListItem: 'MCMockClassA'.
- 	self clickOnListItem: 'boolean'.
- 	
- 	self assertAListMatches: self allCategories.
- 	self assertAListMatches: self definedClasses.
- 	self assertAListMatches: self classAProtocols.
- 	self assertAListMatches: self classABooleanMethods.
- 	self assertTextIs: ''.		!

Item was removed:
- ----- Method: MCSerializationTest>>assertVersionsMatchWith: (in category 'asserting') -----
- assertVersionsMatchWith: writerClass
- 	| stream readerClass expected actual |
- 	readerClass := writerClass readerClass.
- 	expected := self mockVersion.
- 	stream := RWBinaryOrTextStream on: String new.
- 	writerClass fileOut: expected on: stream.
- 	actual := readerClass versionFromStream: stream reset.
- 	self assertVersion: actual matches: expected.!

Item was removed:
- ----- Method: MCSnapshotResource class>>mockPackage (in category 'as yet unclassified') -----
- mockPackage
- 	^ (MCPackage new name: self mockPackageName)!

Item was removed:
- ----- Method: MCStWriterTest>>assertAllChunksAreWellFormed (in category 'asserting') -----
- assertAllChunksAreWellFormed
- 	stream reset.
- 	stream 
- 		untilEnd: [self assertChunkIsWellFormed: stream nextChunk]
- 		displayingProgress: 'Checking syntax...'!

Item was removed:
- ----- Method: MCStWriterTest>>testOrganizationDefinition (in category 'testing') -----
- testOrganizationDefinition
- 	| definition |
- 	definition := MCOrganizationDefinition categories: 
- 					(self mockPackage packageInfo systemCategories).
- 	writer visitOrganizationDefinition: definition.
- 	self assertContentsOf: stream match: self expectedOrganizationDefinition.
- 	self assertAllChunksAreWellFormed.!

Item was removed:
- ----- Method: MCSerializationTest>>testStSerialization (in category 'testing') -----
- testStSerialization
- 	self assertSnapshotsMatchWith: MCStWriter.!

Item was removed:
- ----- Method: MCMergingTest>>testIdenticalModification (in category 'tests') -----
- testIdenticalModification
- 	self
- 		assertMerge: #(a2 b1)
- 				with: #(a2 b1)
- 				base: #(a1 b1)
- 				
- 				gives: #(a2 b1)
- 				conflicts: #()!

Item was removed:
- ----- Method: MCSerializationTest>>assertVersionInfosMatchWith: (in category 'asserting') -----
- assertVersionInfosMatchWith: writerClass
- 	| stream readerClass expected actual |
- 	readerClass := writerClass readerClass.
- 	expected := self mockVersion.
- 	stream := RWBinaryOrTextStream on: String new.
- 	writerClass fileOut: expected on: stream.
- 	actual := readerClass versionInfoFromStream: stream reset.
- 	self assert: actual = expected info.!

Item was removed:
- TestCase subclass: #MCSortingTest
- 	instanceVariableNames: ''
- 	classVariableNames: ''
- 	poolDictionaries: ''
- 	category: 'Monticello-Tests'!

Item was removed:
- ----- Method: MCWorkingCopyTest>>assertNumberWhenSavingTo:is: (in category 'asserting') -----
- assertNumberWhenSavingTo: aRepository is: aNumber
- 	| name |
- 	name := nil.
- 	[aRepository storeVersion: workingCopy newVersion]
- 		on: MCVersionNameAndMessageRequest
- 		do: [:n | name := n suggestedName. n resume: (Array with: name with: '')].
- 	self assert: name = (self packageName, '-', Utilities authorInitials, '.', aNumber asString)!

Item was removed:
- ----- Method: MCFileInTest>>tearDown (in category 'running') -----
- tearDown
- 	(diff isNil or: [diff isEmpty not])
- 		 ifTrue: [expected updatePackage: self mockPackage]!

Item was removed:
- ----- Method: MCSerializationTest>>mockDiffyVersion (in category 'mocks') -----
- mockDiffyVersion
- 	| repos workingCopy base next |
- 	repos := MCDictionaryRepository new.
- 	workingCopy := MCWorkingCopy forPackage: self mockPackage.
- 	workingCopy repositoryGroup addRepository: repos.
- 	MCRepositoryGroup default removeRepository: repos.
- 	base := self mockVersion.
- 	repos storeVersion: base.
- 	self change: #a toReturn: 'a2'.
- 	next := self mockVersionWithAncestor: base.
- 	^ next asDiffAgainst: base	!

Item was removed:
- ----- Method: MCClassDefinitionTest>>testEqualsSensitivity (in category 'as yet unclassified') -----
- testEqualsSensitivity
- 	| message a b defA args defB |
- 	message := self creationMessage.
- 	a := #(ClassA SuperA CategoryA #(iVarA) #(CVarA) #(PoolA) #(ciVarA)
- 			typeA 'A comment' 'A').
- 	b := #(ClassB SuperB CategoryB #(iVarB) #(CVarB) #(PoolB) #(ciVarB)
- 			typeB 'B comment' 'B').
- 	
- 	defA := message valueWithArguments: a.
- 	1 to: 8 do: [:index |
- 				args := a copy.
- 				args at: index put: (b at: index).
- 				defB := message valueWithArguments: args.
- 				self deny: defA = defB.]!

Item was removed:
- ----- Method: MCStReaderTest>>testCommentWithoutStyle (in category 'as yet unclassified') -----
- testCommentWithoutStyle
- 	| reader |
- 	reader := MCStReader on: self commentWithoutStyle readStream.
- 	self assert: (reader definitions anySatisfy: [:ea | ea isMethodDefinition]).!

Item was removed:
- ----- Method: MCSnapshotResource>>setUp (in category 'as yet unclassified') -----
- setUp
- 	snapshot := self class takeSnapshot.!

Item was removed:
- ----- Method: MCVersionTest>>assert:orders:as: (in category 'asserting') -----
- assert: aSelector orders: sexpr as: array
- 	| expected |
- 	expected := OrderedCollection new.
- 	version := self versionFromTree: sexpr.
- 	version perform: aSelector with: [:ea | expected add: ea info name].
- 	self assert: expected asArray = array!

Item was removed:
- ----- Method: MCSnapshotBrowserTest>>assertAListIncludes: (in category 'asserting') -----
- assertAListIncludes: anArrayOfStrings
- 	self listMorphs 
- 			detect: [:m | m getList includesAllOf: anArrayOfStrings]
- 			ifNone: [self assert: false].!




More information about the Squeak-dev mailing list