Skip to content

Commit

Permalink
50685
Browse files Browse the repository at this point in the history
17975 #hierarchyClassTree sort by #name instead of #printString
	https://pharo.fogbugz.com/f/cases/17975

17995 load rubric 2.19
	https://pharo.fogbugz.com/f/cases/17995

http://files.pharo.org/image/50/50685.zip
  • Loading branch information
Jenkins Build Server authored and ci committed Apr 14, 2016
1 parent 0881e8b commit 8edf880
Show file tree
Hide file tree
Showing 25 changed files with 58 additions and 68 deletions.
@@ -1,7 +1,7 @@
stable: spec
<symbolicVersion: #'stable'>

spec for: #'common' version: '2.18'.
spec for: #'common' version: '2.19'.

spec for: #'pharo3.x' version: '1.2.8'.

Expand Down
@@ -0,0 +1,11 @@
version219: spec
<version: '2.19' imports: #('2.2-baseline' )>

spec for: #'common' do: [
spec blessing: #'stable'.
spec description: 'merge all an more'.
spec author: 'DenisKudryashov'.
spec timestamp: '4/13/2016 13:48'.
spec
package: 'Rubric' with: 'Rubric-MarcusDenker.360';
package: #'Rubric-Rules' with: 'Rubric-Rules-YuriyTymchuk.3'. ].
Expand Up @@ -6,5 +6,5 @@ hierarchyClassTree
( self subclasses
reject: [ :class | class isClassSide ]
thenCollect: [ :cls | cls hierarchyClassTree ]
) sorted: [ :a :b | a first printString <= b first printString ]
) sort: [ :a :b | a first name <= b first name ]
}
@@ -1,4 +1,4 @@
ReBasicTreeRule subclass: #RbScriptingSetBeforeModel
ReInvocationSequenceRule subclass: #RbScriptingSetBeforeModel
instanceVariableNames: ''
classVariableNames: ''
poolDictionaries: ''
Expand Down
@@ -1,2 +1,2 @@
group
^ 'Bug'
^ 'Rubric'

This file was deleted.

This file was deleted.

This file was deleted.

@@ -0,0 +1,4 @@
initialize
super initialize.

self add: #(beForSmalltalkScripting beForSmalltalkCode) requiresPreSend: #model:

This file was deleted.

This file was deleted.

@@ -0,0 +1,3 @@
acceptAllowed

^ editingMode acceptAllowed
Expand Up @@ -2,7 +2,4 @@ plugFindReplace
self announcer
when: MorphGotFocus send: #whenTextAreaGotFocus: to: RubFindReplaceService default;
when: MorphLostFocus send: #whenTextAreaLostFocus: to: RubFindReplaceService default;
when: RubSelectionChanged send: #whenTextAreaSelectionChanged: to: RubFindReplaceService default.

RubFindReplaceService default announcer weak when: RubFindTextChanged send: #whenFindTextChanged: to: self

when: RubSelectionChanged send: #whenTextAreaSelectionChanged: to: RubFindReplaceService default
@@ -1,3 +1,2 @@
unplugFindReplace
self announcer unsubscribe: RubFindReplaceService default.
RubFindReplaceService default announcer unsubscribe: self
self announcer unsubscribe: RubFindReplaceService default
@@ -0,0 +1,5 @@
outOfWorld: aWorld

super outOfWorld: aWorld.

aWorld removeAlarm: #hideShow for: self.
2 changes: 1 addition & 1 deletion Rubric.package/RubFindReplaceService.class/definition.st
@@ -1,5 +1,5 @@
Model subclass: #RubFindReplaceService
instanceVariableNames: 'findText replaceText caseSensitive entireWordsOnly wrapAround searchBackwards findStartIndex isRegex dialog announcer textAreaHolder'
instanceVariableNames: 'findText replaceText caseSensitive entireWordsOnly wrapAround searchBackwards findStartIndex isRegex dialog textAreaHolder'
classVariableNames: 'Singleton'
poolDictionaries: ''
category: 'Rubric-Editing-FindReplaceService'

This file was deleted.

@@ -1,5 +1,5 @@
findText: aStringOrText
findText := aStringOrText asText.
self findPolicyChanged.
self announcer announce: RubFindTextChanged new.
self textArea whenFindTextChanged: RubFindTextChanged new.
^ true
@@ -1,4 +1,4 @@
textArea: aTextArea
textAreaHolder at: 1 put: aTextArea.
aTextArea announcer
aTextArea announcer
when: RubFindReplaceWindowRequired send: #whenFindReplaceWindowRequired: to: self.
@@ -1,2 +1,3 @@
whenTextAreaLostFocus: anAnnounce
self announcer announce: RubFindTextChanged new
self dialog isInWorld ifFalse: [ ^self ].
self textArea whenFindTextChanged: RubFindTextChanged new
@@ -1,3 +1,3 @@
findPolicyChanged
self changed: #findPolicy.
self announcer announce: RubFindTextChanged new
self textArea whenFindTextChanged: RubFindTextChanged new
@@ -1,4 +1,4 @@
script50684
script50685

^ 'AST-Core-TheIntegrator.411.mcz
AST-FFI-Pharo50Compatibility-EstebanLorenzano.1.mcz
Expand Down Expand Up @@ -202,13 +202,13 @@ Multilingual-TextConversion-TheIntegrator.81.mcz
Multilingual-TextConverterOtherLanguages-TheIntegrator.4.mcz
NECompletion-TheIntegrator.240.mcz
NECompletion-Tests-TheIntegrator.10.mcz
Nautilus-TheIntegrator.1235.mcz
Nautilus-GroupManager-TheIntegrator.19.mcz
Nautilus-GroupManagerUI-TheIntegrator.30.mcz
Nautilus-Tests-TheIntegrator.31.mcz
NautilusCommon-TheIntegrator.304.mcz
NautilusGroupAutoBuilder-TheIntegrator.10.mcz
NautilusRefactoring-TheIntegrator.271.mcz
Nautilus-TheIntegrator.1236.mcz
Nautilus-GroupManager-TheIntegrator.20.mcz
Nautilus-GroupManagerUI-TheIntegrator.31.mcz
Nautilus-Tests-TheIntegrator.32.mcz
NautilusCommon-TheIntegrator.305.mcz
NautilusGroupAutoBuilder-TheIntegrator.11.mcz
NautilusRefactoring-TheIntegrator.272.mcz
Network-Kernel-TheIntegrator.127.mcz
Network-MIME-MarcusDenker.69.mcz
Network-Mail-TheIntegrator.45.mcz
Expand All @@ -234,7 +234,7 @@ PragmaCollector-TheIntegrator.10.mcz
ProfStef-Core-TheIntegrator.73.mcz
ProfStef-Help-TheIntegrator.16.mcz
ProfStef-Tests-TheIntegrator.27.mcz
QualityAssistant-YuriyTymchuk.96.mcz
QualityAssistant-YuriyTymchuk.97.mcz
QualityAssistantRecording-YuriyTymchuk.20.mcz
RPackage-Core-TheIntegrator.428.mcz
RPackage-Tests-TheIntegrator.181.mcz
Expand Down

This file was deleted.

@@ -0,0 +1,9 @@
update50685
"self new update50685"
self withUpdateLog: '17975 #hierarchyClassTree sort by #name instead of #printString
https://pharo.fogbugz.com/f/cases/17975
17995 load rubric 2.19
https://pharo.fogbugz.com/f/cases/17995'.
self loadTogether: self script50685 merge: false.
self loadConfiguration: 'Rubric' version: '2.19'.self flushCaches.
@@ -1,3 +1,6 @@
commentForCurrentUpdate
^ '17989 QualityAssistant v2.6.3 (memory leak fix)
https://pharo.fogbugz.com/f/cases/17989'
^ '17975 #hierarchyClassTree sort by #name instead of #printString
https://pharo.fogbugz.com/f/cases/17975
17995 load rubric 2.19
https://pharo.fogbugz.com/f/cases/17995'

0 comments on commit 8edf880

Please sign in to comment.