Skip to content

Commit

Permalink
50343
Browse files Browse the repository at this point in the history
16646 test + fix: #after mit access to temp in method
	https://pharo.fogbugz.com/f/cases/16646

16642 availableReifications: return the list of supported reifications for an entity
	https://pharo.fogbugz.com/f/cases/16642

16632 RBParser should reject - space literal
	https://pharo.fogbugz.com/f/cases/16632

http://files.pharo.org/image/50/50343.zip
  • Loading branch information
Jenkins Build Server authored and ci committed Sep 27, 2015
1 parent d938ca3 commit 6a21341
Show file tree
Hide file tree
Showing 13 changed files with 62 additions and 26 deletions.

This file was deleted.

Expand Up @@ -12,6 +12,4 @@ parsePrimitiveObject
[currentToken value = $[ ifTrue: [^self parseBlock].
currentToken value = $( ifTrue: [^self parseParenthesizedExpression].
currentToken value = ${ ifTrue: [^self parseArray]].
(currentToken isBinary and: [ currentToken value = #- ])
ifTrue: [ ^self parseNegatedNumber ].
^ self parserError: 'Variable or expression expected'
@@ -0,0 +1,2 @@
testNegativeNumberError
self should: [ RBParser parseExpression: '- 2' ] raise: SyntaxErrorNotification
@@ -0,0 +1,5 @@
testAvailableReifications
self assert: (RBMessageNode new availableReifications includes: #receiver).
self deny: (RBMessageNode new availableReifications includes: #value).
self assert: ((ReflectivityExamples classVariableNamed: #ClassVar) availableReifications includes: #name).
self deny: ((ReflectivityExamples classVariableNamed: #ClassVar) availableReifications includes: #selector).
@@ -0,0 +1,17 @@
testAfterMethodWithTemps
| methodNode link |
ReflectivityExamples recompile: #exampleAssignment.
methodNode := (ReflectivityExamples >> #exampleAssignment) ast.
link := MetaLink new
metaObject: self;
selector: #tagExec;
control: #after.
methodNode link: link.
self assert: methodNode hasMetalink.
self assert: (ReflectivityExamples >> #exampleAssignment) class = ReflectiveMethod.
self assert: tag isNil.
self assert: ReflectivityExamples new exampleAssignment = 3.
self assert: tag = #yes.
self assert: (ReflectivityExamples >> #exampleAssignment) class = CompiledMethod.
link uninstall.
ReflectivityExamples recompile: #exampleAssignment
Expand Up @@ -4,7 +4,7 @@ emitPrepareLinkAfter: aNode
copied := #().
aNode hasMetalinkAfter ifTrue: [
self emitPreamble: aNode.
aNode isMethod ifTrue: [ copied := aNode argumentNames ].
aNode isMethod ifTrue: [ copied := aNode argumentNames, aNode tempNames ].
methodBuilder
pushClosureCopyCopiedValues: copied
args: #()
Expand Down
@@ -0,0 +1,4 @@
availableReifications
^RFReification subclasses
select: [ :e | e nodes includesAny: self class withAllSuperclasses ]
thenCollect: #key
@@ -0,0 +1,4 @@
availableReifications
^RFReification subclasses
select: [ :e | e nodes includesAny: self class withAllSuperclasses ]
thenCollect: #key
@@ -0,0 +1,4 @@
availableReifications
^RFReification subclasses
select: [ :e | e nodes includesAny: self class withAllSuperclasses ]
thenCollect: #key
@@ -1,7 +1,7 @@
script50342
script50343

^ 'AST-Core-TheIntegrator.373.mcz
AST-Tests-Core-TheIntegrator.77.mcz
^ 'AST-Core-TheIntegrator.374.mcz
AST-Tests-Core-TheIntegrator.79.mcz
Announcements-Core-TheIntegrator.62.mcz
Announcements-Help-TheIntegrator.12.mcz
Announcements-Tests-Core-TheIntegrator.27.mcz
Expand Down Expand Up @@ -244,9 +244,9 @@ Refactoring-Tests-Changes-MarcusDenker.38.mcz
Refactoring-Tests-Core-TheIntegrator.129.mcz
Refactoring-Tests-Critics-TheIntegrator.36.mcz
Refactoring-Tests-Environment-StephaneDucasse.11.mcz
Reflectivity-TheIntegrator.182.mcz
Reflectivity-TheIntegrator.185.mcz
Reflectivity-Examples-TheIntegrator.2.mcz
Reflectivity-Tests-TheIntegrator.151.mcz
Reflectivity-Tests-TheIntegrator.154.mcz
Regex-Core-TheIntegrator.38.mcz
Regex-Help-MarcusDenker.5.mcz
Regex-Tests-Core-MarcusDenker.9.mcz
Expand Down

This file was deleted.

@@ -0,0 +1,12 @@
update50343
"self new update50343"
self withUpdateLog: '16646 test + fix: #after mit access to temp in method
https://pharo.fogbugz.com/f/cases/16646
16642 availableReifications: return the list of supported reifications for an entity
https://pharo.fogbugz.com/f/cases/16642
16632 RBParser should reject - space literal
https://pharo.fogbugz.com/f/cases/16632'.
self loadTogether: self script50343 merge: false.
self flushCaches.
@@ -1,3 +1,9 @@
commentForCurrentUpdate
^ '16640 Reflectivity: add support for reifications #name and #value for Class Variables
https://pharo.fogbugz.com/f/cases/16640'
^ '16646 test + fix: #after mit access to temp in method
https://pharo.fogbugz.com/f/cases/16646
16642 availableReifications: return the list of supported reifications for an entity
https://pharo.fogbugz.com/f/cases/16642
16632 RBParser should reject - space literal
https://pharo.fogbugz.com/f/cases/16632'

0 comments on commit 6a21341

Please sign in to comment.