Skip to content

Commit

Permalink
50152
Browse files Browse the repository at this point in the history
7008 Shared Pools to be treated like dictionaries still necessary?
	https://pharo.fogbugz.com/f/cases/7008

15886 Find class dialog from a scope nautilus window shows all classes
	https://pharo.fogbugz.com/f/cases/15886

15889 do not call asOrderedCollection on compiled methods
	https://pharo.fogbugz.com/f/cases/15889

15892 Cleanups: clean annotation handling + rename HookGenerator2
	https://pharo.fogbugz.com/f/cases/15892

http://files.pharo.org/image/50/50152.zip
  • Loading branch information
Jenkins Build Server authored and ci committed Jul 3, 2015
1 parent 2787bdf commit 5d9ea00
Show file tree
Hide file tree
Showing 35 changed files with 58 additions and 50 deletions.
4 changes: 0 additions & 4 deletions Kernel.package/SharedPool.class/class/enumerating/keysDo_.st

This file was deleted.

Original file line number Diff line number Diff line change
@@ -1,3 +1,3 @@
poolVariableNamesIn: poolName
^(Smalltalk globals at: poolName ifAbsent: [Dictionary new]) keys
^(Smalltalk globals at: poolName ifAbsent: [Dictionary new]) classPool keys
collect: [:name | name asString]
Original file line number Diff line number Diff line change
Expand Up @@ -5,6 +5,6 @@ poolVariableNamesFor: aClass
[:each |
each allPoolDictionaryNames do:
[:pool |
pools addAll: ((Smalltalk globals at: pool asSymbol) keys
pools addAll: ((Smalltalk globals at: pool asSymbol) classPool keys
collect: [:name | name asString])]].
^pools
2 changes: 0 additions & 2 deletions Refactoring-Core.package/extension/SharedPool/class/keys.st

This file was deleted.

Original file line number Diff line number Diff line change
@@ -1,4 +1,4 @@
Object subclass: #HookGenerator2
Object subclass: #HookGenerator
instanceVariableNames: 'node links plugins table reifications'
classVariableNames: ''
poolDictionaries: ''
Expand Down
Original file line number Diff line number Diff line change
@@ -1,23 +1,20 @@
analyseForLinks: aNode
| generator |
aNode propertyAt: #beforeHooks put: OrderedCollection new.
aNode propertyAt: #afterHooks put: OrderedCollection new.
aNode propertyAt: #insteadHooks put: OrderedCollection new.


aNode hasMetalink
ifFalse: [ ^ self ].
generator := HookGenerator2 node: aNode.
generator := HookGenerator node: aNode.

aNode propertyAt: #preambles put: generator preamble.
aNode preambles do: [:each | self visitNode: each].

aNode propertyAt: #beforeHooks put: generator beforeHooks.
aNode beforeHooks do: [:each | self visitNode: each].
aNode hasMetalinkBefore ifTrue: [
aNode propertyAt: #beforeHooks put: generator beforeHooks.
aNode beforeHooks do: [:each | self visitNode: each]].

aNode propertyAt: #afterHooks put: generator afterHooks.
aNode beforeHooks do: [:each | self visitNode: each].
aNode hasMetalinkAfter ifTrue: [
aNode propertyAt: #afterHooks put: generator afterHooks.
aNode beforeHooks do: [:each | self visitNode: each]].

aNode propertyAt: #insteadHooks put: generator insteadHooks.
aNode insteadHooks do: [:each | self visitNode: each].

aNode hasMetalinkInstead ifTrue: [
aNode propertyAt: #insteadHooks put: generator insteadHooks.
aNode insteadHooks do: [:each | self visitNode: each]].
Original file line number Diff line number Diff line change
@@ -1,2 +1,2 @@
afterHooks
^self propertyAt: #afterHooks ifAbsentPut: OrderedCollection new
^self propertyAt: #afterHooks ifAbsent: #()
Original file line number Diff line number Diff line change
@@ -0,0 +1,5 @@
clearReflectivityAnnotations
self removeProperty: #preambles ifAbsent: [ ].
self removeProperty: #beforeHooks ifAbsent: [ ].
self removeProperty: #afterHooks ifAbsent: [ ].
self removeProperty: #insteadHooks ifAbsent: [ ].
Original file line number Diff line number Diff line change
@@ -1,2 +1,2 @@
insteadHooks
^self propertyAt: #insteadHooks ifAbsentPut: IdentitySet new
^self propertyAt: #insteadHooks ifAbsent: #()
Original file line number Diff line number Diff line change
Expand Up @@ -2,4 +2,5 @@ link: aMetaLink
(aMetaLink checkForCompatibilityWith: self) ifFalse: [ self error: 'link requests reification that can not be provided by this node' ].
(self propertyAt: #links ifAbsentPut: [ IdentitySet new ]) add: aMetaLink.
aMetaLink installOn: self.
self clearReflectivityAnnotations.
self methodNode method installLink.
Original file line number Diff line number Diff line change
@@ -1,2 +1,2 @@
preambles
^self propertyAt: #preambles ifAbsentPut: OrderedCollection new
^self propertyAt: #preambles ifAbsent: #()
Original file line number Diff line number Diff line change
@@ -1,4 +1,5 @@
removeLink: aMetaLink
self links remove: aMetaLink.
self links ifEmpty: [ self removeProperty: #links ].
self clearReflectivityAnnotations.
self methodNode method removeLink.
Original file line number Diff line number Diff line change
@@ -1,4 +1,4 @@
script50151
script50152

^ 'AST-Core-TheIntegrator.314.mcz
AST-Tests-Core-TheIntegrator.70.mcz
Expand Down Expand Up @@ -115,7 +115,7 @@ HudsonBuildTools20-TheIntegrator.70.mcz
IssueTracking-TheIntegrator.6.mcz
IssueTracking-Tests-TheIntegrator.3.mcz
Jobs-TheIntegrator.14.mcz
Kernel-TheIntegrator.2076.mcz
Kernel-TheIntegrator.2078.mcz
KernelTests-TheIntegrator.786.mcz
Keymapping-Core-EstebanLorenzano.195.mcz
Keymapping-KeyCombinations-TheIntegrator.55.mcz
Expand Down Expand Up @@ -218,14 +218,14 @@ RPackage-Core-TheIntegrator.391.mcz
RPackage-Tests-TheIntegrator.173.mcz
RecentSubmissions-StephaneDucasse.233.mcz
Refactoring-Changes-TheIntegrator.67.mcz
Refactoring-Core-TheIntegrator.278.mcz
Refactoring-Core-TheIntegrator.280.mcz
Refactoring-Critics-TheIntegrator.183.mcz
Refactoring-Environment-TheIntegrator.58.mcz
Refactoring-Tests-Changes-MarcusDenker.38.mcz
Refactoring-Tests-Core-TheIntegrator.127.mcz
Refactoring-Tests-Critics-TheIntegrator.31.mcz
Refactoring-Tests-Environment-StephaneDucasse.11.mcz
Reflectivity-TheIntegrator.89.mcz
Reflectivity-TheIntegrator.92.mcz
Reflectivity-Tests-TheIntegrator.64.mcz
Regex-Core-MarcusDenker.33.mcz
Regex-Help-MarcusDenker.5.mcz
Expand Down Expand Up @@ -267,7 +267,7 @@ Spec-Layout-TheIntegrator.67.mcz
Spec-MorphicAdapters-TheIntegrator.214.mcz
Spec-PolyWidgets-TheIntegrator.59.mcz
Spec-Tests-TheIntegrator.47.mcz
Spec-Tools-TheIntegrator.272.mcz
Spec-Tools-TheIntegrator.274.mcz
StartupPreferences-TheIntegrator.133.mcz
System-Announcements-TheIntegrator.100.mcz
System-Caching-TheIntegrator.26.mcz
Expand Down Expand Up @@ -299,7 +299,7 @@ Text-Edition-TheIntegrator.89.mcz
Text-Edition-Tests-EstebanLorenzano.3.mcz
Text-Scanning-TheIntegrator.26.mcz
Text-Tests-EstebanLorenzano.7.mcz
Tool-Base-TheIntegrator.87.mcz
Tool-Base-TheIntegrator.89.mcz
Tool-Catalog-EstebanLorenzano.13.mcz
Tool-CriticBrowser-TheIntegrator.5.mcz
Tool-Diff-TheIntegrator.4.mcz
Expand All @@ -316,7 +316,7 @@ Tool-TxWorkspace-TorstenBergmann.5.mcz
Tool-Workspace-TheIntegrator.26.mcz
Tools-TheIntegrator.1503.mcz
ToolsTest-MarcusDenker.denker.71.mcz
Traits-TheIntegrator.797.mcz
Traits-TheIntegrator.799.mcz
Transcript-TheIntegrator.34.mcz
TxText-Athens-SeanDeNigris.50.mcz
TxText-AthensTests-SeanDeNigris.10.mcz
Expand Down

This file was deleted.

Original file line number Diff line number Diff line change
@@ -0,0 +1,15 @@
update50152
"self new update50152"
self withUpdateLog: '7008 Shared Pools to be treated like dictionaries still necessary?
https://pharo.fogbugz.com/f/cases/7008
15886 Find class dialog from a scope nautilus window shows all classes
https://pharo.fogbugz.com/f/cases/15886
15889 do not call asOrderedCollection on compiled methods
https://pharo.fogbugz.com/f/cases/15889
15892 Cleanups: clean annotation handling + rename HookGenerator2
https://pharo.fogbugz.com/f/cases/15892'.
self loadTogether: self script50152 merge: false.
self flushCaches.
Original file line number Diff line number Diff line change
@@ -1,6 +1,12 @@
commentForCurrentUpdate
^ '15891 Reflectivity: New HookGenerator
https://pharo.fogbugz.com/f/cases/15891
^ '7008 Shared Pools to be treated like dictionaries still necessary?
https://pharo.fogbugz.com/f/cases/7008
15871 enable ProcessList
https://pharo.fogbugz.com/f/cases/15871'
15886 Find class dialog from a scope nautilus window shows all classes
https://pharo.fogbugz.com/f/cases/15886
15889 do not call asOrderedCollection on compiled methods
https://pharo.fogbugz.com/f/cases/15889
15892 Cleanups: clean annotation handling + rename HookGenerator2
https://pharo.fogbugz.com/f/cases/15892'
Original file line number Diff line number Diff line change
@@ -1,2 +1,2 @@
selectedMethods
^ self selectedMessage asOrderedCollection
^ {self selectedMessage} asOrderedCollection
Original file line number Diff line number Diff line change
@@ -1,4 +1,4 @@
classSearchInEnvironment: anEnvironment
| classes |
classes := anEnvironment allClassesAndTraits sorted: [ :a :b| a name <= b name ].
classes := anEnvironment classesAndTraits sorted: [ :a :b| a name <= b name ].
^ self classSearchIn: classes.
Original file line number Diff line number Diff line change
Expand Up @@ -3,7 +3,7 @@ possibleVariablesFor: misspelled continuedFrom: oldResults
| results |
results := misspelled correctAgainstDictionary: self classPool continuedFrom: oldResults.
self sharedPools do: [:pool |
results := misspelled correctAgainstDictionary: pool continuedFrom: results ].
results := misspelled correctAgainstDictionary: pool classPool continuedFrom: results ].
self superclass == nil
ifTrue:
[ ^ misspelled correctAgainstDictionary: self environment continuedFrom: results ]
Expand Down

0 comments on commit 5d9ea00

Please sign in to comment.