Skip to content

Commit

Permalink
60417
Browse files Browse the repository at this point in the history
19770 FFIExternalStructurePlatformTests>>#testStructureHasCorrectOffsets32bits is failing on the bootstrapped image
	https://pharo.fogbugz.com/f/cases/19770

19761 Debugger wrong temp var value after multiple step through block
	https://pharo.fogbugz.com/f/cases/19761

http://files.pharo.org/image/60/60417.zip
  • Loading branch information
Jenkins Build Server authored and ci committed Feb 28, 2017
1 parent 17e26d8 commit 4e8d884
Show file tree
Hide file tree
Showing 13 changed files with 54 additions and 32 deletions.
@@ -1,12 +1,9 @@
lookupVar: name inContext: aContext
"We lookup a variable in a context. If it not in this context, we look in the outer context using the corresponding outer scope"

| variable theValue outerContext |
| variable theValue |
variable := self
variableNamed: name
ifAbsent: [
"if we ask for a method, not a block context, do not ask for outerContext"
outerContext := aContext outerContext ifNil: [ aContext ].
^self outerScope lookupVar: name inContext: outerContext ].
ifAbsent: [ ^self outerScopeLookupVar: name inContext: aContext].
theValue := variable readFromContext: aContext scope: self.
^ theValue
@@ -0,0 +1,6 @@
nextOuterScopeContextOf: aContext

"Returns the next context to lookup a variable name from within outer scope.
If it is block context then we return outer context for lookup.
But if it is method context lookup will continue in same context but within outer scope"
^ aContext outerContext ifNil: [ aContext ]
@@ -1,4 +1,4 @@
outerScopeLookupVar: name inContext: aContext
^ self outerScope
lookupVar: name
inContext: (self nextLexicalContextOf: aContext)
inContext: (self nextOuterScopeContextOf: aContext)
@@ -0,0 +1,6 @@
nextOuterScopeContextOf: aContext

"Returns the next context to lookup a variable name from within outer scope.
For inlined BlockClosure which I represent it will be same context because inlined blocks do not produce extra contexts on stack"
^ aContext
@@ -0,0 +1,6 @@
fetchArgFromOptimizedBlockInsideFullBlock: anArg extraArg: anotherArg

| result |
self class withAllSubclassesDo: [ :each |
result := anArg = anArg ifTrue: [ anotherArg value. thisContext tempNamed: #anArg ]].
^result
@@ -0,0 +1,9 @@
testAccessingArgOfOuterBlockFromAnotherDeepBlock

| actual |
actual := [:outerArg |
outerArg asString.
[ :innerArg | innerArg asString. thisContext tempNamed: #outerArg ] value: #innerValue.
] value: #outerValue.

self assert: actual equals: #outerValue
@@ -0,0 +1,5 @@
testAccessingMethodArgFromOptimizedBlockContext

| actual |
actual := self fetchArgFromOptimizedBlockInsideFullBlock: #argValue extraArg: #anotherArg.
self assert: actual equals: #argValue
@@ -1,4 +1,4 @@
script60416
script60417

^ 'AST-Core-TheIntegrator.492.mcz
AST-Tests-Core-TheIntegrator.134.mcz
Expand Down Expand Up @@ -247,8 +247,8 @@ OSWindow-Tests-RonieSalgado.3.mcz
OSWindow-VM-MerwanOuddane.4.mcz
Ombu-MartinDias.249.mcz
OmbuTests-MartinDias.22.mcz
OpalCompiler-Core-TheIntegrator.885.mcz
OpalCompiler-Tests-TheIntegrator.378.mcz
OpalCompiler-Core-TheIntegrator.887.mcz
OpalCompiler-Tests-TheIntegrator.380.mcz
OpalTools-TheIntegrator.24.mcz
Pharo-Help-TheIntegrator.34.mcz
PharoBootstrap-Initialization-TheIntegrator.4.mcz
Expand Down Expand Up @@ -410,7 +410,7 @@ UIManager-TheIntegrator.195.mcz
Unicode-Initialization-TheIntegrator.17.mcz
UnifiedFFI-EstebanLorenzano.90.mcz
UnifiedFFI-Legacy-EstebanLorenzano.3.mcz
UnifiedFFI-Tests-TheIntegrator.41.mcz
UnifiedFFI-Tests-TheIntegrator.43.mcz
UpdateStreamer-Core-TheIntegrator.34.mcz
UpdateStreamer-Tests-TheIntegrator.9.mcz
Versionner-Commit-TheIntegrator.38.mcz
Expand Down

This file was deleted.

@@ -0,0 +1,9 @@
update60417
"self new update60417"
self withUpdateLog: '19770 FFIExternalStructurePlatformTests>>#testStructureHasCorrectOffsets32bits is failing on the bootstrapped image
https://pharo.fogbugz.com/f/cases/19770
19761 Debugger wrong temp var value after multiple step through block
https://pharo.fogbugz.com/f/cases/19761'.
self loadTogether: self script60417 merge: false.
self flushCaches.
@@ -1,9 +1,6 @@
commentForCurrentUpdate
^ '19732 Reenable Catalog loading in Spotter and fix confusing/hidden setting for it
https://pharo.fogbugz.com/f/cases/19732
^ '19770 FFIExternalStructurePlatformTests>>#testStructureHasCorrectOffsets32bits is failing on the bootstrapped image
https://pharo.fogbugz.com/f/cases/19770
19769 BaselineOfIDE needs update
https://pharo.fogbugz.com/f/cases/19769
19771 remove debugging "Alive" report during the bootstrap initialization
https://pharo.fogbugz.com/f/cases/19771'
19761 Debugger wrong temp var value after multiple step through block
https://pharo.fogbugz.com/f/cases/19761'
@@ -1,5 +1,6 @@
testStructureHasCorrectOffsets32bits
self is32bits ifFalse: [ ^ self skip ].

FFITestStructureByPlatform compiledSpec. "Ensure fields are initialized"
self assert: (FFITestStructureByPlatform classPool at: #OFFSET_LONG) equals: 1.
self assert: (FFITestStructureByPlatform classPool at: #OFFSET_POINTER) equals: 5
@@ -1,5 +1,6 @@
testStructureHasCorrectOffsets64bits
self is64bits ifFalse: [ ^ self skip ].

FFITestStructureByPlatform compiledSpec. "Ensure fields are initialized"
self assert: (FFITestStructureByPlatform classPool at: #OFFSET_LONG) equals: 1.
self assert: (FFITestStructureByPlatform classPool at: #OFFSET_POINTER) equals: 9

0 comments on commit 4e8d884

Please sign in to comment.