Skip to content

Commit

Permalink
50496
Browse files Browse the repository at this point in the history
17233 Interval cannot be "shuffled"
	https://pharo.fogbugz.com/f/cases/17233

17179 Semantic analysis doesnt compute RBArgumentNode instances
	https://pharo.fogbugz.com/f/cases/17179

http://files.pharo.org/image/50/50496.zip
  • Loading branch information
Jenkins Build Server authored and ci committed Dec 14, 2015
1 parent 950ae89 commit 8812a3e
Show file tree
Hide file tree
Showing 15 changed files with 70 additions and 14 deletions.
@@ -0,0 +1,3 @@
shuffled
"Return an array that contains my elements shuffled in a random order"
^ self asArray shuffle
@@ -0,0 +1,9 @@
testShuffled

| i is |
i := (1 to: 20).
is := i shuffled.
self assert: i ~= is.
self assert: i size equals: is size.
self assert: (is includesAllOf: i).
self assert: (i includesAllOf: is).
@@ -0,0 +1,5 @@
visitArgumentNode: aVariableNode
"mark argument nodes as such, if not already done"

aVariableNode isArgument
ifFalse: [ self changeVariableClass: aVariableNode ]
@@ -1,5 +1,6 @@
visitBlockNode: aBlockNode
"here look at the temps and make copying vars / tempVector out of them"
self visitArgumentNodes: aBlockNode arguments.
scope := aBlockNode scope.
self doRemotes; doCopying.
self visitNode: aBlockNode body.
Expand Down
@@ -1,6 +1,6 @@
visitMethodNode: aMethodNode
"here look at the temps and make copying vars / tempVector out of them"

self visitArgumentNodes: aMethodNode arguments.
scope := aMethodNode scope.
self doRemotes; doCopying.
self visitNode: aMethodNode body.
Expand Down
@@ -0,0 +1,8 @@
testBlockArgumentIsArgumentVariable
| ast blockNode |
ast := (OCOpalExamples>>#exampleForBlockArgument) parseTree.
ast doSemanticAnalysis.
blockNode := ast body statements first value.
self assert: blockNode arguments notEmpty.
self assert: blockNode arguments first isArgument

@@ -0,0 +1,8 @@
testInlinedBlockArgumentIsArgumentVariable
| ast blockNode |
ast := (OCOpalExamples>>#exampleForInlinedBlockArgument) parseTree.
ast doSemanticAnalysis.
blockNode := ast body statements first arguments first.
self assert: blockNode arguments notEmpty.
self assert: blockNode arguments first isArgument

@@ -0,0 +1,7 @@
testMethodArgumentIsArgumentVariable
| ast |
ast := (OCOpalExamples>>#exampleWithArgument:) parseTree.
ast doSemanticAnalysis .
self assert: ast arguments notEmpty.
self assert: ast arguments first isArgument

@@ -0,0 +1,4 @@
exampleForBlockArgument
|b|
b:= [ :blockArg | 1 ].
^ b
@@ -0,0 +1,3 @@
exampleForInlinedBlockArgument

1 ifNotNil:[ :value | ^ value ].
@@ -0,0 +1,2 @@
exampleWithArgument: anArg
^ anArg
@@ -1,4 +1,4 @@
script50495
script50496

^ 'AST-Core-TheIntegrator.391.mcz
AST-Tests-Core-TheIntegrator.86.mcz
Expand Down Expand Up @@ -36,12 +36,12 @@ Collections-Abstract-TheIntegrator.311.mcz
Collections-Arithmetic-TheIntegrator.20.mcz
Collections-Atomic-TheIntegrator.16.mcz
Collections-Native-TheIntegrator.19.mcz
Collections-Sequenceable-TheIntegrator.223.mcz
Collections-Sequenceable-TheIntegrator.225.mcz
Collections-Stack-TheIntegrator.10.mcz
Collections-Streams-TheIntegrator.188.mcz
Collections-Strings-TheIntegrator.382.mcz
Collections-Support-TheIntegrator.65.mcz
Collections-Tests-TheIntegrator.22.mcz
Collections-Tests-TheIntegrator.24.mcz
Collections-Unordered-TheIntegrator.227.mcz
Collections-Weak-TheIntegrator.93.mcz
Compiler-TheIntegrator.598.mcz
Expand Down Expand Up @@ -230,8 +230,8 @@ OSWindow-Core-MerwanOuddane.94.mcz
OSWindow-SDL2-MerwanOuddane.83.mcz
OSWindow-SDL2-Examples-MerwanOuddane.7.mcz
OSWindow-VM-MerwanOuddane.4.mcz
OpalCompiler-Core-TheIntegrator.765.mcz
OpalCompiler-Tests-TheIntegrator.316.mcz
OpalCompiler-Core-TheIntegrator.767.mcz
OpalCompiler-Tests-TheIntegrator.319.mcz
OpalTools-TheIntegrator.24.mcz
Pharo-Help-TheIntegrator.15.mcz
Polymorph-TaskbarIcons-TheIntegrator.46.mcz
Expand Down

This file was deleted.

@@ -0,0 +1,9 @@
update50496
"self new update50496"
self withUpdateLog: '17233 Interval cannot be "shuffled"
https://pharo.fogbugz.com/f/cases/17233
17179 Semantic analysis doesnt compute RBArgumentNode instances
https://pharo.fogbugz.com/f/cases/17179'.
self loadTogether: self script50496 merge: false.
self flushCaches.
@@ -1,3 +1,6 @@
commentForCurrentUpdate
^ '17226 PluggableListMorph>>#userString should return one string
https://pharo.fogbugz.com/f/cases/17226'
^ '17233 Interval cannot be "shuffled"
https://pharo.fogbugz.com/f/cases/17233
17179 Semantic analysis doesnt compute RBArgumentNode instances
https://pharo.fogbugz.com/f/cases/17179'

0 comments on commit 8812a3e

Please sign in to comment.