Skip to content

Commit

Permalink
50397
Browse files Browse the repository at this point in the history
16834 implement Nautilus class>>emptyCommentWarning:
	https://pharo.fogbugz.com/f/cases/16834

16437 World Contents Menu should have a maximum string length for its elements
	https://pharo.fogbugz.com/f/cases/16437

16830 fix known locales initialization
	https://pharo.fogbugz.com/f/cases/16830

16825 make standalone Gofer-UI package
	https://pharo.fogbugz.com/f/cases/16825

http://files.pharo.org/image/50/50397.zip
  • Loading branch information
Jenkins Build Server authored and ci committed Oct 21, 2015
1 parent 80df9f2 commit edacb19
Show file tree
Hide file tree
Showing 17 changed files with 46 additions and 30 deletions.
Expand Up @@ -2,4 +2,4 @@ GoferLocalChanges subclass: #GoferBrowseLocalChanges
instanceVariableNames: ''
classVariableNames: ''
poolDictionaries: ''
category: 'Gofer-Core'
category: 'Gofer-UI'
Expand Up @@ -2,4 +2,4 @@ GoferRemoteChanges subclass: #GoferBrowseRemoteChanges
instanceVariableNames: ''
classVariableNames: ''
poolDictionaries: ''
category: 'Gofer-Core'
category: 'Gofer-UI'
Expand Up @@ -6,22 +6,22 @@ contentsMenu: aMenu
collapsed := self windowsSatisfying: [ :w | w isCollapsed ].
(expanded asSortedCollection: [ :w1 :w2 | w1 label caseInsensitiveLessOrEqual: w2 label ])
do: [ :w |
aMenu add: w label target: w selector: #activateAndForceLabelToShow.
aMenu add: (self truncatedMenuLabelFor: w label) target: w selector: #activateAndForceLabelToShow.
aMenu lastItem icon: w taskbarIcon.
w model canDiscardEdits
ifFalse: [ aMenu lastItem color: Color red ] ].
aMenu addLine.
(collapsed asSortedCollection: [ :w1 :w2 | w1 label caseInsensitiveLessOrEqual: w2 label ])
do: [ :w |
aMenu add: w label target: w selector: #collapseOrExpand.
aMenu add: (self truncatedMenuLabelFor: w label) target: w selector: #collapseOrExpand.
aMenu lastItem icon: w taskbarIcon.
w model canDiscardEdits
ifFalse: [ aMenu lastItem color: Color red ] ].
aMenu addLine.
((self submorphs reject: [ :sm | (expanded includes: sm) or: [ collapsed includes: sm ] ])
asSortedCollection: [ :w1 :w2 | w1 class name caseInsensitiveLessOrEqual: w2 class name ])
do: [ :w |
aMenu add: w class name target: w selector: #comeToFront.
aMenu add: (self truncatedMenuLabelFor: w class name) target: w selector: #comeToFront.
aMenu lastItem icon: w taskbarIcon ].

^ aMenu
@@ -0,0 +1,2 @@
truncatedMenuLabelFor: aWindowLabel
^ aWindowLabel truncateWithElipsisTo: 47
@@ -0,0 +1,2 @@
emptyCommentWarning: aBoolean
emptyCommentWarning := aBoolean
@@ -1,4 +1,4 @@
script50396
script50397

^ 'AST-Core-TheIntegrator.387.mcz
AST-Tests-Core-TheIntegrator.82.mcz
Expand Down Expand Up @@ -106,8 +106,9 @@ Glamour-Tests-Core-BernardoContreras.106.mcz
Glamour-Tests-Morphic-AndreiChis.124.mcz
Glamour-Tests-Resources-AndreiChis.3.mcz
Glamour-Tests-Rubric-AndreiChis.14.mcz
Gofer-Core-TheIntegrator.235.mcz
Gofer-Core-TheIntegrator.237.mcz
Gofer-Tests-TheIntegrator.164.mcz
Gofer-UI-TheIntegrator.2.mcz
Graphics-Canvas-TheIntegrator.6.mcz
Graphics-Display Objects-TheIntegrator.165.mcz
Graphics-Files-TheIntegrator.66.mcz
Expand Down Expand Up @@ -172,7 +173,7 @@ MonticelloMocks-EstebanLorenzano.2.mcz
MonticelloRemoteRepositories-TheIntegrator.10.mcz
Moose-Algos-Graph-ChristopheDemarey.30.mcz
Morphic-Base-TheIntegrator.495.mcz
Morphic-Core-TheIntegrator.216.mcz
Morphic-Core-TheIntegrator.218.mcz
Morphic-Examples-TheIntegrator.46.mcz
Morphic-Tests-TheIntegrator.2.mcz
Morphic-Widgets-Basic-TheIntegrator.64.mcz
Expand Down Expand Up @@ -204,7 +205,7 @@ NativeBoost-Pools-CamilloBruni.13.mcz
NativeBoost-Tests-TheIntegrator.94.mcz
NativeBoost-Unix-TheIntegrator.19.mcz
NativeBoost-Win32-TheIntegrator.59.mcz
Nautilus-TheIntegrator.1112.mcz
Nautilus-TheIntegrator.1114.mcz
Nautilus-GroupManager-TheIntegrator.15.mcz
Nautilus-GroupManagerUI-TheIntegrator.24.mcz
Nautilus-Tests-TheIntegrator.25.mcz
Expand Down Expand Up @@ -315,7 +316,7 @@ System-Hashing-TheIntegrator.47.mcz
System-History-EstebanLorenzano.7.mcz
System-History-Tests-EstebanLorenzano.3.mcz
System-Installers-TheIntegrator.44.mcz
System-Localization-TheIntegrator.94.mcz
System-Localization-TheIntegrator.96.mcz
System-Localization-Tests-TheIntegrator.8.mcz
System-Model-TheIntegrator.2.mcz
System-OSEnvironments-TheIntegrator.4.mcz
Expand Down

This file was deleted.

@@ -0,0 +1,15 @@
update50397
"self new update50397"
self withUpdateLog: '16834 implement Nautilus class>>emptyCommentWarning:
https://pharo.fogbugz.com/f/cases/16834
16437 World Contents Menu should have a maximum string length for its elements
https://pharo.fogbugz.com/f/cases/16437
16830 fix known locales initialization
https://pharo.fogbugz.com/f/cases/16830
16825 make standalone Gofer-UI package
https://pharo.fogbugz.com/f/cases/16825'.
self loadTogether: self script50397 merge: false.
self flushCaches.
@@ -1,9 +1,12 @@
commentForCurrentUpdate
^ '16821 broken ArraydCollection>>#writeOnGZIPByteStream:
https://pharo.fogbugz.com/f/cases/16821
^ '16834 implement Nautilus class>>emptyCommentWarning:
https://pharo.fogbugz.com/f/cases/16834
16820 rename "node" to "entity" in RFReification
https://pharo.fogbugz.com/f/cases/16820
16437 World Contents Menu should have a maximum string length for its elements
https://pharo.fogbugz.com/f/cases/16437
16828 implement doNop
https://pharo.fogbugz.com/f/cases/16828'
16830 fix known locales initialization
https://pharo.fogbugz.com/f/cases/16830
16825 make standalone Gofer-UI package
https://pharo.fogbugz.com/f/cases/16825'
@@ -0,0 +1,5 @@
defaultLocales

"return IDs of default locales"

^ #(de en ja 'ja-kids' nl no sv)
Expand Up @@ -3,6 +3,6 @@ initKnownLocales
locales := Dictionary new.

"Init the locales for which we have translations"
NaturalLanguageTranslator availableLanguageLocaleIDs do: [:id |
locales at: id put: (Locale new localeID: id)].
self defaultLocales do: [:id |
locales at: id put: (self new localeID: id)].
^locales

0 comments on commit edacb19

Please sign in to comment.