[VisualWorks home]

Class Hierarchy and instance variable names of VisualWorks


I don't know I can put the results on the web page. So please evaluate below under your VisualWorks environment. This code can run VW2.5.2 and VWNC3.0a.

	| filestream root fileName |

	root := Smalltalk at: #Object ifAbsent: [^self error: 'nothing'].
	"change filename under your VW version."
	fileName := 'VWNC30Classes.txt'.
	filestream := (fileName asFilename withEncoding: #default) writeStream.
	[Cursor wait 
		showWhile: 
			[Smalltalk timeStamp: filestream.
			filestream cr.
			filestream tab; 
			nextPutAll: 'Answer a description containing the names and instance variable names of all of the subclasses of ''', root printString, '''.'.
			filestream nextPutAll: root printHierarchy]]
		valueNowOrOnUnwindDo: [filestream close].
	^filestream

Created: Apr 1, 1999,
[VisualWorks home]