Morph subclass: #TestMorph
    instanceVariableNames: 'path '
    classVariableNames: ''
    poolDictionaries: ''
    category: 'NU-STuff'!



!TestMorph methodsFor: 'as yet unclassified' stamp: 'ss 9/24/2000 09:57'!

drawOn: aCanvas
| colors |
colors := Color wheel: 10.
colors withIndexDo: [:c :i |
aCanvas fillOval: (self bounds insetBy: self width // 25 * i + 1)
color: c]. ! !

!TestMorph methodsFor: 'as yet unclassified' stamp: 'ss 9/24/2000 09:56'!
handlesMouseDown: evt
^ true ! !

!TestMorph methodsFor: 'as yet unclassified' stamp: 'ss 9/24/2000 09:57'!
initialize
super initialize.
path := OrderedCollection new.! !

!TestMorph methodsFor: 'as yet unclassified' stamp: 'ss 9/24/2000 09:58'!
mouseDown: evt
self startAnimation. ! !

!TestMorph methodsFor: 'as yet unclassified' stamp: 'ss 9/24/2000 09:58'!
startAnimation
path := OrderedCollection new.
0 to: 29 do: [:i | path add: self position + (0@(i squared / 5.0))].
path := path, path reversed.
self startStepping. ! !

!TestMorph methodsFor: 'as yet unclassified' stamp: 'ss 9/24/2000 09:58'!
step
path size > 0 ifTrue: [self position: path removeFirst]. ! !

!TestMorph methodsFor: 'as yet unclassified' stamp: 'ss 9/24/2000 09:58'!
stepTime
^ 5 ! !