Hi Mariano,

It seems this is a bug in the OB tools. It works in Pharo-core.
Please create an issue in the tracker.

Cheers,
Adrian

On Mar 20, 2009, at 05:16 , Mariano Martinez Peck wrote:

> I am trying to see the senders of a message. I select "startsWith:"  
> in a
> workspace -> right button -> extended search -> senders of it and I  
> get a
> wallback.
>
> If you think this is a bug, let me know and I add it to the issue  
> tracker.
>
> Thanks,
>
> Mariano
>
>
>
> MessageNotUnderstood: OBShowSenders class>>of:label:
> 20 March 2009 1:11:08 am
>
> VM: unix - a SmalltalkImage
> Image: Pharo0.1 [Latest update: #10256]
>
> SecurityManager state:
> Restricted: false
> FileAccess: true
> SocketAccess: true
> Working Dir /home/mariano/squeak/imagenes
> Trusted Dir /home/mariano/squeak/imagenes/secure
> Untrusted Dir /home/mariano/squeak/imagenes/My Squeak
>
> OBShowSenders class(Object)>>doesNotUnderstand: #of:label:
>    Receiver: OBShowSenders
>    Arguments and temporary variables:
>        aMessage:     of: an OBSelectorNode label: 'Senders of  
> startsWith:
> [4]'
>        exception:     MessageNotUnderstood: OBShowSenders  
> class>>of:label:
>        resumeValue:     nil
>    Receiver's instance variables:
>        superclass:     OBNavigate
>        methodDict:     a MethodDictionary(#browserClass->a  
> CompiledMethod
> (3617) #noChildr...etc...
>        format:     136
>        instanceVariables:     nil
>        organization:     ('as yet unclassified' browserClass
> noChildrenMessage)
>
>        subclasses:     nil
>        name:     #OBShowSenders
>        classPool:     nil
>        sharedPools:     nil
>        environment:     Smalltalk
>        category:     #'OB-Standard-Announcements'
>        traitComposition:     nil
>        localSelectors:     nil
>
> DEVToolSet class>>browseSendersOf:name:autoSelect:
>    Receiver: DEVToolSet
>    Arguments and temporary variables:
>        aSymbol:     #startsWith:
>        labelString:     'Senders of startsWith: [4]'
>        autoSelectString:     'startsWith:'
>    Receiver's instance variables:
>        superclass:     StandardToolSet
>        methodDict:     a MethodDictionary()
>        format:     2
>        instanceVariables:     nil
>        organization:     ('as yet unclassified')
>
>        subclasses:     nil
>        name:     #DEVToolSet
>        classPool:     nil
>        sharedPools:     nil
>        environment:     Smalltalk
>        category:     #ImageForDevelopers
>        traitComposition:     nil
>        localSelectors:     nil
>
> ToolSet class>>browseSendersOf:name:autoSelect:
>    Receiver: ToolSet
>    Arguments and temporary variables:
>        aSymbol:     #startsWith:
>        titleString:     'Senders of startsWith: [4]'
>        autoSelectString:     'startsWith:'
>    Receiver's instance variables:
>        superclass:     AppRegistry
>        methodDict:     a MethodDictionary()
>        format:     2
>        instanceVariables:     nil
>        organization:     ('as yet unclassified')
>
>        subclasses:     nil
>        name:     #ToolSet
>        classPool:     nil
>        sharedPools:     nil
>        environment:     Smalltalk
>        category:     #'System-Applications'
>        traitComposition:     nil
>        localSelectors:     nil
>        registeredClasses:     an OrderedCollection(StandardToolSet
> OTToolset DEVToolSet)
>        default:     DEVToolSet
>
> SystemNavigation>>browseSendersOf:name:autoSelect:
>    Receiver: a SystemNavigation
>    Arguments and temporary variables:
>        aSelector:     #startsWith:
>        labelString:     'Senders of startsWith:'
>        autoSelectString:     'startsWith:'
>        title:     'Senders of startsWith: [4]'
>        size:     4
>        senders:     an OrderedCollection(a MethodReference Algernon >>
> #isMatchingClass:gi...etc...
>    Receiver's instance variables:
>        browserClass:     nil
>        hierarchyBrowserClass:     nil
>
>
> --- The full stack ---
> OBShowSenders class(Object)>>doesNotUnderstand: #of:label:
> DEVToolSet class>>browseSendersOf:name:autoSelect:
> ToolSet class>>browseSendersOf:name:autoSelect:
> SystemNavigation>>browseSendersOf:name:autoSelect:
> - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - -
> SystemNavigation>>browseAllCallsOn:
> [] in TextMorphForShoutEditor(ParagraphEditor)>>sendersOfIt {[self
> systemNavigation browseAllCallsOn: aSelector]}
> TextMorphForShoutEditor(Controller)>>terminateAndInitializeAround:
> TextMorphForShoutEditor(ParagraphEditor)>>sendersOfIt
> [] in PluggableShoutMorph(PluggableTextMorph)>>sendersOfIt {[textMorph
> editor sendersOfIt]}
> [] in PluggableShoutMorph(PluggableTextMorph)>>handleEdit: {[result :=
> editBlock value]}
> TextMorphForShout(TextMorph)>>handleEdit:
> PluggableShoutMorph(PluggableTextMorph)>>handleEdit:
> PluggableShoutMorph(PluggableTextMorph)>>sendersOfIt
> UndefinedObject(Object)>>perform:orSendTo:
> [] in ToggleMenuItemMorph(MenuItemMorph)>>invokeWithEvent:  
> {[(selArgCount :=
> selector numArgs) = 0   ifTrue: [target perform: selector] ...]}
> BlockContext>>ensure:
> CursorWithMask(Cursor)>>showWhile:
> ToggleMenuItemMorph(MenuItemMorph)>>invokeWithEvent:
> ToggleMenuItemMorph(MenuItemMorph)>>mouseUp:
> ToggleMenuItemMorph(MenuItemMorph)>>handleMouseUp:
> MouseButtonEvent>>sentTo:
> ToggleMenuItemMorph(Morph)>>handleEvent:
> MorphicEventDispatcher>>dispatchDefault:with:
> MorphicEventDispatcher>>dispatchEvent:with:
> ToggleMenuItemMorph(Morph)>>processEvent:using:
> MorphicEventDispatcher>>dispatchDefault:with:
> MorphicEventDispatcher>>dispatchEvent:with:
> ...etc...
> _______________________________________________
> Pharo-project mailing list
> Pharo-project@lists.gforge.inria.fr
> http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project


_______________________________________________
Pharo-project mailing list
Pharo-project@lists.gforge.inria.fr
http://lists.gforge.inria.fr/cgi-bin/mailman/listinfo/pharo-project

Reply via email to