Skip to content

Commit

Permalink
50054
Browse files Browse the repository at this point in the history
15425 Make AST based syntax coloring the default
	https://pharo.fogbugz.com/f/cases/15425

15563 ClassOrganization>>#categories should not answer "all" category 
	https://pharo.fogbugz.com/f/cases/15563

http://files.pharo.org/image/50/50054.zip
  • Loading branch information
Jenkins Build Server authored and ci committed May 20, 2015
1 parent 2e7d6b2 commit 1694da0
Show file tree
Hide file tree
Showing 22 changed files with 52 additions and 55 deletions.
@@ -1,6 +1,6 @@
fileEntriesDo: aBlock
self flag: 'Hardcoded extension packages :/'.
self realCategories
self categories
reject: [ :name | name == Protocol nullCategory or: [ name first = $* ]]
thenDo: [ :name |
aBlock value: (ProtocolEntry class: self subject protocol: name)]
@@ -0,0 +1,2 @@
allCategories
^ self protocolOrganizer allProtocolsNames
@@ -0,0 +1,2 @@
allProtocols
^ self protocolOrganizer allProtocols
@@ -0,0 +1,2 @@
allProtocolsNames
^ self allProtocols collect: #name
@@ -1,3 +1,2 @@
categories

^ self protocolOrganizer allProtocolsNames
^ self protocolOrganizer protocolsNames

This file was deleted.

@@ -1,7 +1,6 @@
testRemoveCategory
self assert: self organization categories size = 3.
self assert: self organization categories size = 2.
self should: [ self organization removeCategory: 'one' ] raise: Error.
self organization removeCategory: 'empty'.
self assert: self organization categories size = 2.
self assert: self organization categories first = AllProtocol defaultName.
self assert: self organization categories second = 'one'
self assert: self organization categories size = 1.
self assert: self organization categories first = 'one'
@@ -1,2 +1,2 @@
protocolsForClass: aClass
^ aClass organization categories
^ aClass organization allCategories
@@ -1,3 +1,5 @@
loadPackagesCategoriesInSystemEnvironmentFor: class

^ self sortCategories: class protocols forClass: class
^ self
sortCategories: class organization allProtocolsNames
forClass: class
@@ -1,7 +1,7 @@
removeClass: aClass
"Remove the class and all its methods from the receiver. If we have a protocol which looks like an extension of us, rename it to 'as yet unclassified' to avoid breaking things afterwards."

aClass organization realCategories
aClass organization categories
do: [ :each |
(self isYourClassExtension: each)
ifTrue: [ aClass organization renameCategory: each toBe: Protocol defaultName ] ].
Expand Down
Expand Up @@ -7,9 +7,9 @@ basicImportClass: aClass

| protocols |
self addClassDefinition: aClass.
aClass organization realCategories
aClass organization categories
do: [ :each |
(self isYourClassExtension: each)
ifTrue: [ aClass organization renameCategory: each toBe: Protocol defaultName ] ].
protocols := aClass organization realCategories reject: [ :each | each first = $* ].
protocols := aClass organization categories reject: [ :each | each first = $* ].
protocols do: [ :each | self importProtocol: each forClass: aClass ]
@@ -1,4 +1,5 @@
coreCategoriesForClass: aClass

self flag: #stef. "only used by goferCleanUp"
^ aClass organization realCategories reject: [ :cat | self isForeignClassExtension: cat ]
^ aClass organization categories
reject: [ :cat | self isForeignClassExtension: cat ]
@@ -1,3 +1,4 @@
extensionCategoriesForClass: aClass
self flag: #stef. "only used by goferCleanUp and PackageEnvironment of RB"
^ aClass organization realCategories select: [:cat | self isYourClassExtension: cat]
^ aClass organization categories
select: [ :cat | self isYourClassExtension: cat ]
@@ -1,2 +1,3 @@
protocolsFor: aClass
^aClass organization realCategories select: [:each | self includesProtocol: each in: aClass]
^aClass organization categories
select: [ :each | self includesProtocol: each in: aClass ]
@@ -1,4 +1,4 @@
script50053
script50054

^ 'AST-Core-TheIntegrator.294.mcz
AST-Tests-Core-TheIntegrator.68.mcz
Expand Down Expand Up @@ -114,8 +114,8 @@ HudsonBuildTools20-TheIntegrator.65.mcz
IssueTracking-TheIntegrator.6.mcz
IssueTracking-Tests-TheIntegrator.3.mcz
Jobs-EstebanLorenzano.4.mcz
Kernel-TheIntegrator.2030.mcz
KernelTests-TheIntegrator.774.mcz
Kernel-TheIntegrator.2031.mcz
KernelTests-TheIntegrator.776.mcz
Keymapping-Core-EstebanLorenzano.195.mcz
Keymapping-KeyCombinations-TheIntegrator.48.mcz
Keymapping-Pragmas-TheIntegrator.50.mcz
Expand Down Expand Up @@ -148,7 +148,7 @@ Metacello-TestsPlatform.squeakCommon-MarcusDenker.19.mcz
Metacello-ToolBox-MarcusDenker.141.mcz
Metacello-Tutorial-EstebanLorenzano.27.mcz
Monticello-StephaneDucasse.1018.mcz
Monticello-Tests-TheIntegrator.6.mcz
Monticello-Tests-TheIntegrator.8.mcz
MonticelloConfigurations-MarcusDenker.70.mcz
MonticelloFileTree-Core-TheIntegrator.182.mcz
MonticelloFileTree-FileSystem-Utilities-MarcusDenker.32.mcz
Expand Down Expand Up @@ -184,7 +184,7 @@ NativeBoost-Pools-CamilloBruni.13.mcz
NativeBoost-Tests-TheIntegrator.92.mcz
NativeBoost-Unix-MarcusDenker.17.mcz
NativeBoost-Win32-TheIntegrator.57.mcz
Nautilus-StephaneDucasse.920.mcz
Nautilus-TheIntegrator.922.mcz
Nautilus-Tests-StephaneDucasse.14.mcz
NautilusCommon-TheIntegrator.260.mcz
NautilusRefactoring-TheIntegrator.216.mcz
Expand Down Expand Up @@ -212,14 +212,14 @@ PragmaCollector-TheIntegrator.3.mcz
ProfStef-Core-TheIntegrator.57.mcz
ProfStef-Help-SvenVanCaekenberghe.14.mcz
ProfStef-Tests-TheIntegrator.25.mcz
RPackage-Core-TheIntegrator.385.mcz
RPackage-Core-TheIntegrator.387.mcz
RPackage-SystemIntegration-TheIntegrator.234.mcz
RPackage-Tests-StephaneDucasse.169.mcz
RecentSubmissions-StephaneDucasse.233.mcz
Refactoring-Changes-TheIntegrator.65.mcz
Refactoring-Core-TheIntegrator.270.mcz
Refactoring-Critics-TheIntegrator.173.mcz
Refactoring-Environment-TheIntegrator.52.mcz
Refactoring-Environment-TheIntegrator.54.mcz
Refactoring-Tests-Changes-MarcusDenker.38.mcz
Refactoring-Tests-Core-TheIntegrator.123.mcz
Refactoring-Tests-Critics-TheIntegrator.31.mcz
Expand Down Expand Up @@ -296,7 +296,7 @@ Text-Edition-TheIntegrator.83.mcz
Text-Edition-Tests-EstebanLorenzano.3.mcz
Text-Scanning-TheIntegrator.26.mcz
Text-Tests-EstebanLorenzano.7.mcz
Tool-Base-TheIntegrator.72.mcz
Tool-Base-TheIntegrator.74.mcz
Tool-Browser-Old-TheIntegrator.37.mcz
Tool-Changes-TheIntegrator.22.mcz
Tool-ConfigurationBrowser-TheIntegrator.17.mcz
Expand All @@ -314,7 +314,7 @@ Tool-TxWorkspace-TorstenBergmann.5.mcz
Tool-Workspace-TheIntegrator.24.mcz
Tools-TheIntegrator.1503.mcz
ToolsTest-MarcusDenker.denker.71.mcz
Traits-StephaneDucasse.763.mcz
Traits-TheIntegrator.765.mcz
Transcript-StephaneDucasse.32.mcz
TxText-Athens-SeanDeNigris.49.mcz
TxText-AthensTests-SeanDeNigris.10.mcz
Expand Down

This file was deleted.

@@ -0,0 +1,11 @@
update50054
"self new update50054"
self withUpdateLog: '15425 Make AST based syntax coloring the default
https://pharo.fogbugz.com/f/cases/15425
15563 ClassOrganization>>#categories should not answer "all" category
https://pharo.fogbugz.com/f/cases/15563'.
self loadTogether: self script50054 merge: false.

SHRBTextStyler useAstColoring: true.
self flushCaches.
@@ -1,12 +1,6 @@
commentForCurrentUpdate
^ '15564 Association key:value:
https://pharo.fogbugz.com/f/cases/15564
^ '15425 Make AST based syntax coloring the default
https://pharo.fogbugz.com/f/cases/15425
15549 "References an abstract class" should check method
https://pharo.fogbugz.com/f/cases/15549
15566 Direct dependency from CompiledMethod to the bytecode set
https://pharo.fogbugz.com/f/cases/15566
15523 Code Cruft Rule Only Matches One-Liners
https://pharo.fogbugz.com/f/cases/15523'
15563 ClassOrganization>>#categories should not answer "all" category
https://pharo.fogbugz.com/f/cases/15563'
Expand Up @@ -3,7 +3,7 @@ protocolSuggestionsFor: aClass
| allExistingProtocols interestingProtocols reject |
reject := Set new.
reject
addAll: aClass organization categories;
addAll: aClass organization allCategories;
add: AllProtocol defaultName;
add: Protocol nullCategory;
add: Protocol unclassified.
Expand Down
Expand Up @@ -6,7 +6,7 @@ categorizeMethods: aCollection of: aClass from: aCategory
aClass ifNil: [^self].
labels := OrderedCollection new.
labels
addAll: aClass organization categories copy sort;
addAll: aClass organization allCategories copy sort;
add: Protocol unclassified.
lines := OrderedCollection new.
lines add: labels size -1.
Expand Down
Expand Up @@ -5,7 +5,7 @@ fileOutChangedMessages: aSet on: aFileStream moveSource: moveSource toFile: file
Note when this method is called with moveSource=true, it is condensing the
.changes file, and should only write a preamble for every method."
| org |
(org := self organization) realCategories do:
(org := self organization) categories do:
[:cat | | sels |
sels := (org listAtCategoryNamed: cat) select: [:sel | aSet includes: sel].
sels do:
Expand Down
Expand Up @@ -11,7 +11,7 @@ fileOutOn: aFileStream moveSource: moveSource toFile: fileIndex
numbered: fileIndex
moveSource: moveSource
forClass: self.
self organization realCategories do:
self organization categories do:
[:heading |
self fileOutCategory: heading
on: aFileStream
Expand Down

0 comments on commit 1694da0

Please sign in to comment.