On Thu, Nov 8, 2012 at 5:59 PM, Marcus Denker <marcus.den...@inria.fr> wrote:
> [update 2.0] #20386
> 20386
> -----
>
> Issue 6933:     Fixing the fact that typing ...
>         http://code.google.com/p/pharo/issues/detail?id=6933
>
> Issue 6853:     Monticello merge conflicts on reordered package names
>         http://code.google.com/p/pharo/issues/detail?id=6853
>
> Issue 6760:     Traits dont get repackaged
>         http://code.google.com/p/pharo/issues/detail?id=6760
>

it seems that something is wrong with this Traits fix, when I try to
load tests to the Pharo Kernel, I started to got this error:

10 UndefinedObject(Object)>>doesNotUnderstand: #category
11 Trait class>>named:uses:category:env:
12 Trait class>>named:uses:category:
13 UndefinedObject>>DoIt

The full stack:

Error:
MessageNotUnderstood: receiver of "category" is nil
68
1 [:t2 |
| t3 |
t3 := FileStream forceNewFileNamed: 'PharoDebug.log'.
        t3 nextPutAll: 'Error:';
                 cr.
        t3 nextPutAll: t2 asString;
                 cr.
        t3 nextPutAll: thisContext stack size asString;
                 cr.
        thisContext stack copy
                withIndexDo: [:t4 :t5 | [t3 nextPutAll: t5 asString;
                                 space;
                                 nextPutAll: t4 asString;
                                 cr]
                                ifError: [:t6 | t3 nextPutAll: t6 asString;
                                                 cr]].
        t3 close.
        Smalltalk exitFailure] in UndefinedObject>>DoIt
2 BlockClosure>>cull:
3 BlockClosure>>cull:cull:
4 [:ex | errorHandlerBlock cull: ex description cull: ex receiver] in
BlockClosure>>ifError:
5 BlockClosure>>cull:
6 [self exceptionHandlerBlock cull: exception] in
MethodContext(ContextPart)>>handleSignal:
7 BlockClosure>>ensure:
8 MethodContext(ContextPart)>>handleSignal:
9 MessageNotUnderstood(Exception)>>signal
10 UndefinedObject(Object)>>doesNotUnderstand: #category
11 Trait class>>named:uses:category:env:
12 Trait class>>named:uses:category:
13 UndefinedObject>>DoIt
14 Compiler>>evaluate:in:to:notifying:ifFail:logged:
15 Compiler class>>evaluate:for:notifying:logged:
16 Compiler class>>evaluate:for:logged:
17 Compiler class>>evaluate:logged:
18 DoItDeclaration>>import
19 [:decl | value := decl import] in CodeImporter>>evaluateDeclarations
20 OrderedCollection>>do:
21 CodeImporter>>evaluateDeclarations
22 CodeImporter class>>evaluateReadStream:
23 [:t2 |
CodeImporter evaluateReadStream: (t2 , '.st') asFileReference readStream.
        FileStream stdout nextPutAll: t2 , ' loaded';
                 lf] in ['SUnit-Core
SUnit-Tests
CollectionsTests
Announcements-Tests-Core
CompilerTests
CompressionTests
FileSystem-Tests-AnsiStreams
FileSystem-Tests-Core
FileSystem-Tests-Disk
FileSystem-Tests-Memory
KernelTests
Multilingual-Tests
Ring-Tests-Kernel
Ring-Tests-Containers
Tests-Bugs
Tests-CodeImport
Tests-Compression
Tests-Exceptions
Tests-Files
Tests-Finalization
Tests-Localization
Tests-Object Events
Tests-ObjectsAsMethods
Tests-Release
FooSharedPool
Tests-System
Tests-System-CommandLine
Tests-SystemChangeNotification
Tests-SystemTests-Support
Tests-Traits
Tests-Traits-MOP
Tests-VM
HudsonBuildTools'
                linesDo: [:t2 |
                        CodeImporter evaluateReadStream: (t2 , '.st') 
asFileReference readStream.
                        FileStream stdout nextPutAll: t2 , ' loaded';
                                 lf].
        FileStream stdout nextPutAll: 'Load tests finished';
                 lf.
        SmalltalkImage current snapshot: true andQuit: true] in 
UndefinedObject>>DoIt
24 [:start :endWithoutDelimiters :end | aBlock
                value: (self copyFrom: start to: endWithoutDelimiters)] in
ByteString(String)>>linesDo:
25 ByteString(String)>>lineIndicesDo:
26 ByteString(String)>>linesDo:
27 ['SUnit-Core
SUnit-Tests
CollectionsTests
Announcements-Tests-Core
CompilerTests
CompressionTests
FileSystem-Tests-AnsiStreams
FileSystem-Tests-Core
FileSystem-Tests-Disk
FileSystem-Tests-Memory
KernelTests
Multilingual-Tests
Ring-Tests-Kernel
Ring-Tests-Containers
Tests-Bugs
Tests-CodeImport
Tests-Compression
Tests-Exceptions
Tests-Files
Tests-Finalization
Tests-Localization
Tests-Object Events
Tests-ObjectsAsMethods
Tests-Release
FooSharedPool
Tests-System
Tests-System-CommandLine
Tests-SystemChangeNotification
Tests-SystemTests-Support
Tests-Traits
Tests-Traits-MOP
Tests-VM
HudsonBuildTools'
                linesDo: [:t2 |
                        CodeImporter evaluateReadStream: (t2 , '.st') 
asFileReference readStream.
                        FileStream stdout nextPutAll: t2 , ' loaded';
                                 lf].
        FileStream stdout nextPutAll: 'Load tests finished';
                 lf.
        SmalltalkImage current snapshot: true andQuit: true] in 
UndefinedObject>>DoIt
28 BlockClosure>>on:do:
29 BlockClosure>>ifError:
30 UndefinedObject>>DoIt
31 Compiler>>evaluate:in:to:notifying:ifFail:logged:
32 Compiler class>>evaluate:for:notifying:logged:
33 Compiler class>>evaluate:for:logged:
34 Compiler class>>evaluate:logged:
35 DoItDeclaration>>import
36 [:decl | value := decl import] in CodeImporter>>evaluate
37 OrderedCollection>>do:
38 CodeImporter>>evaluate
39 [codeImporter evaluate] in BasicCodeLoader>>installSourceFile:
40 BlockClosure>>on:do:
41 BasicCodeLoader>>handleErrorsDuring:reference:
42 BasicCodeLoader>>installSourceFile:
43 [:reference | self installSourceFile: reference] in [sourceFiles
                do: [:reference | self installSourceFile: reference]] in
BasicCodeLoader>>installSourceFiles
44 OrderedCollection>>do:
45 [sourceFiles
                do: [:reference | self installSourceFile: reference]] in
BasicCodeLoader>>installSourceFiles
46 BlockClosure>>ensure:
47 BasicCodeLoader>>installSourceFiles
48 BasicCodeLoader>>activate
49 BasicCodeLoader class(CommandLineHandler class)>>activateWith:
50 DefaultCommandLineHandler>>handleSubcommand
51 DefaultCommandLineHandler>>handleArgument:
52 DefaultCommandLineHandler>>activate
53 [self new activate] in DefaultCommandLineHandler class>>startUp:
54 BlockClosure>>cull:
55 [each cull: resuming] in [:each | self
                logStartUpErrorDuring: [each cull: resuming]
                into: errors
                tryDebugger: self isInteractive] in
SmalltalkImage>>executeDeferredStartupActions:
56 BlockClosure>>on:do:
57 SmalltalkImage>>logStartUpErrorDuring:into:tryDebugger:
58 [:each | self
                logStartUpErrorDuring: [each cull: resuming]
                into: errors
                tryDebugger: self isInteractive] in
SmalltalkImage>>executeDeferredStartupActions:
59 OrderedCollection>>do:
60 SmalltalkImage>>executeDeferredStartupActions:
61 SmalltalkImage>>startupImage:snapshotWorked:
62 SmalltalkImage>>snapshot:andQuit:
63 [self snapshot: true andQuit: true] in
SmalltalkImage>>privSaveImageWithCleanup
64 BlockClosure>>on:do:
65 BlockClosure>>ifError:
66 SmalltalkImage>>privSaveImageWithCleanup
67 [self privSaveImageWithCleanup] in SmalltalkImage>>saveImageInNewContext
68 [self value.
        Processor terminateActive] in BlockClosure>>newProcess

Reply via email to