Skip to content

Commit

Permalink
50581
Browse files Browse the repository at this point in the history
14165 ObsoleteTest>>#testFixObsoleteSharedPools
	https://pharo.fogbugz.com/f/cases/14165

16428 cmd+r (rename temporary) does not works all the time
	https://pharo.fogbugz.com/f/cases/16428

17556 Update TxText: In Linux some shortcuts use alt, some others ctrl
	https://pharo.fogbugz.com/f/cases/17556

17330 Push up method refactoring triggers debuggers 
	https://pharo.fogbugz.com/f/cases/17330

http://files.pharo.org/image/50/50581.zip
  • Loading branch information
Jenkins Build Server authored and ci committed Feb 12, 2016
1 parent 954c211 commit 3472406
Show file tree
Hide file tree
Showing 13 changed files with 63 additions and 43 deletions.
@@ -0,0 +1,16 @@
version2122: spec
<version: '2.12.2' imports: #('1.0.1-baseline' )>

spec for: #'common' do: [
spec blessing: #'stable'.
spec description: '16122 TextLink positions are wrong
16121 TxTextStyler can not process RBSelfNode'.
spec author: 'MarcusDenker'.
spec timestamp: '10/8/2015 15:03'.
spec
package: 'TxText-Model' with: 'TxText-Model-SeanDeNigris.61';
package: 'TxTextTests-Model' with: 'TxTextTests-Model-SeanDeNigris.29';
package: 'TxText-Athens' with: 'TxText-Athens-GuillermoPolito.53';
package: 'TxText-AthensTests' with: 'TxText-AthensTests-SeanDeNigris.10';
package: 'TxText-Styler' with: 'TxText-Styler-MarcusDenker.17';
package: 'Tool-TxWorkspace' with: 'Tool-TxWorkspace-NicolaiHess.7'. ].
@@ -0,0 +1,4 @@
performRefactoringFor: aSymbol withArguments: anArray
[ self performRefactoring: (self perform: aSymbol withArguments: anArray) ]
on: RefactoringAborted
do: [ :ex | self inform: 'Refactoring aborted' ]
@@ -1,5 +1,3 @@
renameTemporaryNamed: oldname Between: anInterval from: aMethod
| refactoring |
aMethod ifNil: [ ^ self ].
refactoring := self privateRenameTemporaryNamed: oldname Between: anInterval from: aMethod.
self performRefactoring: refactoring
self performRefactoringFor: #privateRenameTemporaryNamed:Between:from: withArguments: {oldname. anInterval. aMethod}.
@@ -1,7 +1,8 @@
renameTextSelectionForMethod
| selectedInterval method |
| selectedInterval method tempNode |
method := self model selectedMethod.
selectedInterval := self model selectionInterval.
selectedInterval first = 1
ifTrue: [ ^ self renameMethodFor: method ].
self renameTemporaryNamed: self model contentSelection Between: selectedInterval from: method
tempNode := (method ast bestNodeFor: selectedInterval).
self renameTemporaryNamed: tempNode name Between: (tempNode start to: tempNode stop) from: method
@@ -1,8 +1,7 @@
testClassObsolete
| aClass obj |
self skip.
Smalltalk globals at: #ClassForObsoleteTest ifPresent: [ :cls | cls removeFromSystem ].
aClass := Object subclass: #ClassForObsoleteTest.
aClass := classFactory newClass.
obj := aClass new.
self deny: aClass isObsolete.
self deny: aClass class isObsolete.
Expand Down
@@ -1,6 +1,5 @@
testFixObsoleteSharedPools
| poolClass obsoletePoolName testClass preFixObsoleteClassNames postFixObsoleteClassNames |
self skip.
poolClass := classFactory newClass. "provides unique name over time via class variable counter"
testClass := classFactory
newSubclassOf: classFactory defaultSuperclass
Expand Down
@@ -1,17 +1,13 @@
testTraitObsolete
| aClass obj aTrait |
self skip.
Smalltalk globals at: #ClassForObsoleteTest ifPresent: [ :cls | cls removeFromSystem ].
Smalltalk globals at: #TraitForObsoleteTest ifPresent: [ :tr | tr removeFromSystem ].

aTrait := Trait named: #TraitForObsoleteTest.
aClass := Object subclass: #ClassForObsoleteTest uses: {aTrait}.
aTrait := classFactory newTrait.
aClass := classFactory newClassUsing: aTrait.

obj := aClass new.
self deny: aTrait isObsolete.
aTrait removeFromSystem.
self assert: aTrait isObsolete.
self deny: aClass isObsolete.

Smalltalk globals at: #ClassForObsoleteTest ifPresent: [ :cls | cls removeFromSystem ].
Smalltalk globals at: #TraitForObsoleteTest ifPresent: [ :tr | tr removeFromSystem ].
self deny: aClass isObsolete
@@ -1,4 +1,4 @@
script50580
script50581

^ 'AST-Core-TheIntegrator.399.mcz
AST-FFI-Pharo50Compatibility-EstebanLorenzano.1.mcz
Expand Down Expand Up @@ -223,7 +223,7 @@ Nautilus-GroupManagerUI-TheIntegrator.30.mcz
Nautilus-Tests-TheIntegrator.31.mcz
NautilusCommon-TheIntegrator.304.mcz
NautilusGroupAutoBuilder-TheIntegrator.8.mcz
NautilusRefactoring-TheIntegrator.264.mcz
NautilusRefactoring-TheIntegrator.266.mcz
Network-Kernel-TheIntegrator.123.mcz
Network-MIME-MarcusDenker.69.mcz
Network-Mail-TheIntegrator.45.mcz
Expand Down Expand Up @@ -271,7 +271,7 @@ Reflectivity-Tools-Tests-TheIntegrator.8.mcz
Regex-Core-TheIntegrator.38.mcz
Regex-Help-MarcusDenker.5.mcz
Regex-Tests-Core-MarcusDenker.9.mcz
ReleaseTests-TheIntegrator.23.mcz
ReleaseTests-TheIntegrator.25.mcz
Renraku-YuriyTymchuk.103.mcz
Renraku-Test-YuriyTymchuk.19.mcz
Ring-Core-Containers-TheIntegrator.43.mcz
Expand All @@ -281,7 +281,7 @@ Ring-Tests-Containers-MarcusDenker.18.mcz
Ring-Tests-Kernel-TheIntegrator.90.mcz
Ring-Tests-Monticello-MarcusDenker.19.mcz
RingChunkImporter-TheIntegrator.4.mcz
Rubric-TheIntegrator.333.mcz
Rubric-NicolaiHess.335.mcz
STON-Core-SvenVanCaekenberghe.58.mcz
STON-Tests-SvenVanCaekenberghe.53.mcz
SUnit-Core-TheIntegrator.163.mcz
Expand Down Expand Up @@ -311,7 +311,7 @@ Spec-Layout-TheIntegrator.69.mcz
Spec-MorphicAdapters-TheIntegrator.254.mcz
Spec-PolyWidgets-TheIntegrator.64.mcz
Spec-Tests-TheIntegrator.58.mcz
Spec-Tools-TheIntegrator.317.mcz
Spec-Tools-TheIntegrator.320.mcz
StartupPreferences-EstebanLorenzano.147.mcz
System-Announcements-TheIntegrator.108.mcz
System-BasicCommandLineHandler-EstebanLorenzano.13.mcz
Expand Down

This file was deleted.

@@ -0,0 +1,15 @@
update50581
"self new update50581"
self withUpdateLog: '14165 ObsoleteTest>>#testFixObsoleteSharedPools
https://pharo.fogbugz.com/f/cases/14165
16428 cmd+r (rename temporary) does not works all the time
https://pharo.fogbugz.com/f/cases/16428
17556 Update TxText: In Linux some shortcuts use alt, some others ctrl
https://pharo.fogbugz.com/f/cases/17556
17330 Push up method refactoring triggers debuggers
https://pharo.fogbugz.com/f/cases/17330'.
self loadTogether: self script50581 merge: false.
self loadConfiguration: 'TxText' version: '2.12.2'.self flushCaches.
@@ -1,9 +1,12 @@
commentForCurrentUpdate
^ '17113 Context menu in SyntaxErrorDebugger broken
https://pharo.fogbugz.com/f/cases/17113
^ '14165 ObsoleteTest>>#testFixObsoleteSharedPools
https://pharo.fogbugz.com/f/cases/14165
17558 Update Rubric: In Linux some shortcuts use alt, some others ctrl
https://pharo.fogbugz.com/f/cases/17558
16428 cmd+r (rename temporary) does not works all the time
https://pharo.fogbugz.com/f/cases/16428
17561 Add a release test to test the presence of critical classes in startup list
https://pharo.fogbugz.com/f/cases/17561'
17556 Update TxText: In Linux some shortcuts use alt, some others ctrl
https://pharo.fogbugz.com/f/cases/17556
17330 Push up method refactoring triggers debuggers
https://pharo.fogbugz.com/f/cases/17330'
@@ -1,2 +1,3 @@
intervalOf: aSelector inCode: aText of: aMethod
aMethod compiledMethod ifNil: [ ^ 0 to: 0 ].
^ (self sourceIntervalOf: aSelector in: aMethod ast) ifEmpty: [ self searchedString: aSelector asString in: aText ]
Expand Up @@ -16,15 +16,15 @@ buildTextEditorKeymapsOn: aBuilder
Character backspace. #handleBackspaceKey.
Character pageDown. #movePageDown.
Character pageUp. #movePageUp.
$z command. #undo.
$z meta. #undo.
Character arrowRight shift. #extendSelectionRight.
Character arrowLeft shift. #extendSelectionLeft.
Character arrowUp shift. #extendSelectionUp.
Character arrowDown shift. #extendSelectionDown.
$v command. #pasteClipboard.
$c command. #copyToClipboard.
$x command. #cutToClipboard.
$a command. #selectAll.
$v meta. #pasteClipboard.
$c meta. #copyToClipboard.
$x meta. #cutToClipboard.
$a meta. #selectAll.

} pairsDo: [ :key :action |
(aBuilder shortcut: action )
Expand Down

0 comments on commit 3472406

Please sign in to comment.