Classes: Added on Squeak 2.0 AcornFileDirectory ActorDroneMorph ActorState AlignmentMorph AssignmentTileMorph AuthorizedSwikiAction BooleanScriptEditor ButtonMorph CachedSwikiAction CodeServer ColorSeerTile ColorTileMorph CommandTilesMorph Component Component1 ComponentLayout ComponentLikeModel CompositeTransform CompoundTileMorph ConnectionQueue DataMorph DriveACar EToyHolder EToyPalette EToyParameters EToyPlaceHolder EToyPlayer EToySystem EToyWorld EToyWorldView FillInTheBlankMorph FindTheLight FunctionComponent InspectorBrowser JoystickMorph ListComponent MVCMenuMorph MappedTabsMorph MidiPrimTester MouseDownMorph MouseOverMorph MouseSensorMorph NewHandleMorph NumericReadoutTile ObjectScanner PSwikiAction PSwikiPage PURLmap PaintBoxColorPicker PaintInvokingMorph PartsViewer PasteUpMorph PhraseTileMorph PinMorph PinSpec Player PlayerReferenceReadout PluggableButtonController PluggableButtonMorph PluggableButtonView PluggableListControllerOfMany PluggableListMorph PluggableListMorphByItem PluggableListViewByItem PluggableListViewOfMany PluggableTextController PluggableTextMorph PluggableTextView Presenter PrintComponent ProjectViewMorph ReadOnlyTextController RemoteFileStream ScriptEditorMorph ScriptEvaluatorMorph ScriptInstantiation SerialPort ServerFile SoundTile StandardScriptingSystem StickySketchMorph StringReadoutTile TabbedPaletteComplex TabsMorph TextComponent TextMorphForEditView TextPrinter TileMorph TilePadMorph TranscriptStream UpdatingRectangleMorph UserScript WireMorph Classes: Deleted on Squeak 2.0 (exists 1.31) Bark Boink BookPageMorph BrowserCodeController BrowserCodeView BrowserListController BrowserListView BrowserView ButtonArtExtractorMorph CRFillInTheBlankController ChangeListController ClassListBrowser ClassListController ClassListView Clink ClippingMorph CngsClassList CngsMsgList CodeBrowser ColorMemory2Morph ColorMemoryMorph ConciseInspector ContextStackCodeController ContextStackCodeView ContextStackListController ContextStackListView DebuggerStub DebuggerView DictionaryListController ExternalStream FileController FileListController FileListView FileModel FileTemplateController FileTemplateHolder FileView GeneralListController GeneralListView HiPop HierarchicalMenu IndicatorOnSwitchController InspectCodeController InspectCodeView InspectListController InspectListView InspectorTrash InspectorView LayoutMorph ListControllerOfMany ListPane ListViewOfMany LoPop LockedSwitchController MessageCategoryListController MessageCategoryListView MessageListController MessageListView MonotonicFunctionMorph MorphicModel1 NotifyStringHolderController ObjectInspector PasswordPublic Pluck Riffle ServerSocket SwitchController SwitchView SyntaxErrorListController SyntaxErrorListView SystemCategoryListController SystemCategoryListView TextCollector TextCollectorController TextCollectorView TextLinkToImplementors ToyboxMorph TriggerController UnsavableWorkspace Wavelets ###################################### "write class names of 1.31" | classes stream | classes := OrderedCollection new: Metaclass allInstances size. Smalltalk do: [:each | (each isKindOf: Behavior) ifTrue: [classes add: each name]]. stream := FileStream newFileNamed: 'Squeak1.31.classes'. classes asSortedCollection do: [:each | stream nextPutAll: each name. stream cr.]. stream close. "comparing on 2.0 to 1.31" | newClasses oldClasses stream newOnly oldOnly aStream aModel diffBlock outBlock | stream := (FileStream oldFileNamed: 'Squeak1.31.classes') contentsOfEntireFile. oldClasses := stream findTokens: String cr. newClasses := OrderedCollection new: Metaclass allInstances size. Smalltalk do: [:each | (each isKindOf: Behavior) ifTrue: [newClasses add: each name printString]]. newOnly := IdentitySet new. oldOnly := IdentitySet new. diffBlock := [:classes :comparativeClasses :targetClasses | classes asSortedCollection do: [:class | (comparativeClasses includes: class) ifFalse: [targetClasses add: class]]]. diffBlock value: newClasses value: oldClasses value: newOnly. diffBlock value: oldClasses value: newClasses value: oldOnly. outBlock := [:head :classes :outStream | outStream nextPutAll: head; cr. classes asSortedCollection do: [:class | outStream tab; nextPutAll: class; cr]]. aStream := WriteStream on: (String new: 10000). outBlock value: 'Classes: Added on Squeak 2.0' value: newOnly value: aStream. aStream cr; cr. outBlock value: 'Classes: Deleted on Squeak 2.0 (exists 1.31)' value: oldOnly value: aStream. aModel := (StringHolder new) contents: aStream contents. StringHolderView open: aModel. ^aModel