Skip to content

Commit

Permalink
Merge pull request #9589 from estebanlm/deprecate-glamour-and-gt
Browse files Browse the repository at this point in the history
deprecate glamour and gt tools
  • Loading branch information
estebanlm authored Jul 15, 2021
2 parents 28f73c7 + 3da46c6 commit e58ef49
Show file tree
Hide file tree
Showing 346 changed files with 1,730 additions and 0 deletions.
5 changes: 5 additions & 0 deletions src/GT-BytecodeDebugger/GTBytecodeDebuggerSession.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -8,6 +8,11 @@ Class {
#category : #'GT-BytecodeDebugger-Model'
}

{ #category : #testing }
GTBytecodeDebuggerSession class >> isDeprecated [
^ true
]

{ #category : #'debugging actions' }
GTBytecodeDebuggerSession >> runToBytecode: aSymbolicBytecode inContext: aContext [
"Attempt to step over instructions in selectedContext until the
Expand Down
Original file line number Diff line number Diff line change
Expand Up @@ -15,6 +15,11 @@ GTGoAndInspectBytecodeDebugAction class >> gtBytecodeDebuggerActionFor: aDebugge
^ (self forDebugger: aDebugger)
]

{ #category : #testing }
GTGoAndInspectBytecodeDebugAction class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTGoAndInspectBytecodeDebugAction >> defaultKeymap [

Expand Down
5 changes: 5 additions & 0 deletions src/GT-BytecodeDebugger/GTStepToBytecodeDebugAction.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -15,6 +15,11 @@ GTStepToBytecodeDebugAction class >> gtBytecodeDebuggerActionFor: aDebugger [
icon: GLMUIThemeExtraIcons glamorousPlay
]

{ #category : #testing }
GTStepToBytecodeDebugAction class >> isDeprecated [
^ true
]

{ #category : #testing }
GTStepToBytecodeDebugAction >> appliesToDebugger: aDebugger [

Expand Down
5 changes: 5 additions & 0 deletions src/GT-Debugger/GTBrowseMethodDebuggerAction.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -15,6 +15,11 @@ GTBrowseMethodDebuggerAction class >> gtActionFor: aDebugger [
icon: GLMUIThemeExtraIcons glamorousBrowse
]

{ #category : #testing }
GTBrowseMethodDebuggerAction class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTBrowseMethodDebuggerAction >> defaultLabel [

Expand Down
5 changes: 5 additions & 0 deletions src/GT-Debugger/GTChangeDebuggerAction.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -40,6 +40,11 @@ GTChangeDebuggerAction class >> gtChangeDebuggerActionsFor: aDebugger [
excluding: aDebugger
]

{ #category : #testing }
GTChangeDebuggerAction class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTChangeDebuggerAction >> debuggerClass: aClass [

Expand Down
5 changes: 5 additions & 0 deletions src/GT-Debugger/GTClearEditorDebugAction.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -15,6 +15,11 @@ GTClearEditorDebugAction class >> gtActionFor: aDebugger [
icon: GLMUIThemeExtraIcons glamorousCancel
]

{ #category : #testing }
GTClearEditorDebugAction class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTClearEditorDebugAction >> defaultIcon [

Expand Down
5 changes: 5 additions & 0 deletions src/GT-Debugger/GTCodeDebugAction.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -11,6 +11,11 @@ Class {
#category : #'GT-Debugger-Actions'
}

{ #category : #testing }
GTCodeDebugAction class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTCodeDebugAction >> codePresentation [
^ self debugger perform: self codePresentationSelector
Expand Down
5 changes: 5 additions & 0 deletions src/GT-Debugger/GTDebuggerBrowserUpdateRequest.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -15,6 +15,11 @@ GTDebuggerBrowserUpdateRequest class >> from: anAnnouncement [
^ self new from: anAnnouncement
]

{ #category : #testing }
GTDebuggerBrowserUpdateRequest class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTDebuggerBrowserUpdateRequest >> debugActionExecutedAnnouncement [
^ debugActionExecutedAnnouncement
Expand Down
Original file line number Diff line number Diff line change
Expand Up @@ -17,6 +17,11 @@ GTGenericStackDebuggerSelectionChanged class >> forDebugger: aDebugger [
^ self new forDebugger: aDebugger
]

{ #category : #testing }
GTGenericStackDebuggerSelectionChanged class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTGenericStackDebuggerSelectionChanged >> debugger [

Expand Down
5 changes: 5 additions & 0 deletions src/GT-Debugger/GTGlamourWrapperDebuggingAction.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -22,6 +22,11 @@ GTGlamourWrapperDebuggingAction class >> gtActionFor: aDebugger [
order: (index := index + 10) ]
]

{ #category : #testing }
GTGlamourWrapperDebuggingAction class >> isDeprecated [
^ true
]

{ #category : #transformation }
GTGlamourWrapperDebuggingAction >> asGlamourAction [
|actionBlock|
Expand Down
5 changes: 5 additions & 0 deletions src/GT-Debugger/GTHelpDebugAction.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -14,6 +14,11 @@ GTHelpDebugAction class >> gtDebuggingAction [
"<gtDebuggingAction>"
]

{ #category : #testing }
GTHelpDebugAction class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTHelpDebugAction >> defaultIcon [

Expand Down
5 changes: 5 additions & 0 deletions src/GT-Debugger/GTRunToSelectionDebugAction.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -15,6 +15,11 @@ GTRunToSelectionDebugAction class >> gtActionFor: aDebugger [
icon: GLMUIThemeExtraIcons glamorousPlay
]

{ #category : #testing }
GTRunToSelectionDebugAction class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTRunToSelectionDebugAction >> defaultOrder [

Expand Down
5 changes: 5 additions & 0 deletions src/GT-Debugger/GTWhereIsDebugAction.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -15,6 +15,11 @@ GTWhereIsDebugAction class >> gtActionFor: aDebugger [
icon: GLMUIThemeExtraIcons glamorousSearch
]

{ #category : #testing }
GTWhereIsDebugAction class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTWhereIsDebugAction >> defaultOrder [

Expand Down
5 changes: 5 additions & 0 deletions src/GT-Debugger/ManifestGTDebugger.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -7,6 +7,11 @@ Class {
#category : #'GT-Debugger-Manifest'
}

{ #category : #testing }
ManifestGTDebugger class >> isDeprecated [
^ true
]

{ #category : #unloading }
ManifestGTDebugger class >> preUnload [
GTGenericStackDebugger closeAllDebuggers
Expand Down
5 changes: 5 additions & 0 deletions src/GT-Inspector/GTInspectorContextIndexedTempNode.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -17,6 +17,11 @@ GTInspectorContextIndexedTempNode class >> hostObject: aContext tempIndex: anInt
yourself
]

{ #category : #testing }
GTInspectorContextIndexedTempNode class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTInspectorContextIndexedTempNode >> label [
^ self tempIndex
Expand Down
5 changes: 5 additions & 0 deletions src/GT-Inspector/GTInspectorContextNamedTempNode.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -23,6 +23,11 @@ GTInspectorContextNamedTempNode class >> hostObject: aContext tempName: aString
yourself
]

{ #category : #testing }
GTInspectorContextNamedTempNode class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTInspectorContextNamedTempNode >> errorMessage [
^ 'error obtaining field value'
Expand Down
5 changes: 5 additions & 0 deletions src/GT-Inspector/GTInspectorDynamicNode.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -20,6 +20,11 @@ GTInspectorDynamicNode class >> hostObject: anObject label: aString value: anoth
yourself
]

{ #category : #testing }
GTInspectorDynamicNode class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTInspectorDynamicNode >> key [
^ label
Expand Down
5 changes: 5 additions & 0 deletions src/GT-Inspector/GTInspectorIndexedNode.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -17,6 +17,11 @@ GTInspectorIndexedNode class >> hostObject: anObject index: index [
yourself
]

{ #category : #testing }
GTInspectorIndexedNode class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTInspectorIndexedNode >> errorMessage [
^ 'error obtaining indexed attribute value'
Expand Down
5 changes: 5 additions & 0 deletions src/GT-Inspector/GTInspectorPresentationFilter.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -10,6 +10,11 @@ Class {
#category : #'GT-Inspector'
}

{ #category : #testing }
GTInspectorPresentationFilter class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTInspectorPresentationFilter >> changeFilterRequestFor: aGTInspector [

Expand Down
5 changes: 5 additions & 0 deletions src/GT-Inspector/GTInspectorProtoObjectNode.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -18,6 +18,11 @@ GTInspectorProtoObjectNode class >> hostObject: anObject index: index slotName:
yourself
]

{ #category : #testing }
GTInspectorProtoObjectNode class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTInspectorProtoObjectNode >> index: anIndex slotName: aSlotName [
index := anIndex.
Expand Down
5 changes: 5 additions & 0 deletions src/GT-Inspector/GTInspectorVariableNode.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -30,6 +30,11 @@ GTInspectorVariableNode class >> hostObject: anObject [
yourself
]

{ #category : #testing }
GTInspectorVariableNode class >> isDeprecated [
^ true
]

{ #category : #composition }
GTInspectorVariableNode >> childrenNodesFor: aVariablesBrowser [
"Return a collection of subvariable nodes to be displayed in a given raw variables browser.
Expand Down
5 changes: 5 additions & 0 deletions src/GT-Inspector/GTObjectPrinter.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -27,6 +27,11 @@ GTObjectPrinter class >> asTruncatedTextFrom: anObject [
do: [ Text string: 'error printing' attribute: TextColor red ]
]

{ #category : #testing }
GTObjectPrinter class >> isDeprecated [
^ true
]

{ #category : #printing }
GTObjectPrinter >> asNonTruncatedTextFrom: anObject [
^ self class asNonTruncatedTextFrom: anObject
Expand Down
5 changes: 5 additions & 0 deletions src/GT-Inspector/GTSnippets.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -18,6 +18,11 @@ GTSnippets class >> instance [
^ instance ifNil: [ instance := self new ]
]

{ #category : #testing }
GTSnippets class >> isDeprecated [
^ true
]

{ #category : #initialization }
GTSnippets class >> reset [
instance := nil
Expand Down
5 changes: 5 additions & 0 deletions src/GT-Playground/GTPlayBook.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -111,6 +111,11 @@ GTPlayBook class >> instance [
^ instance ifNil: [ instance := self new ]
]

{ #category : #testing }
GTPlayBook class >> isDeprecated [
^ true
]

{ #category : #initialization }
GTPlayBook class >> reset [

Expand Down
5 changes: 5 additions & 0 deletions src/GT-Playground/GTPlayPage.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -76,6 +76,11 @@ GTPlayPage class >> gtExampleEmpty [
^ self new
]

{ #category : #testing }
GTPlayPage class >> isDeprecated [
^ true
]

{ #category : #'instance creation' }
GTPlayPage class >> loadFromPublishUrl: aString [
^ [ self basicLoadFromPublishUrl: aString ]
Expand Down
5 changes: 5 additions & 0 deletions src/GT-Playground/GTPlayPageFilePersistence.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -4,6 +4,11 @@ Class {
#category : #'GT-Playground'
}

{ #category : #testing }
GTPlayPageFilePersistence class >> isDeprecated [
^ true
]

{ #category : #private }
GTPlayPageFilePersistence >> deleteFromFileSystem [

Expand Down
5 changes: 5 additions & 0 deletions src/GT-Playground/GTPlayPagePersistence.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -7,6 +7,11 @@ Class {
#category : #'GT-Playground'
}

{ #category : #testing }
GTPlayPagePersistence class >> isDeprecated [
^ true
]

{ #category : #testing }
GTPlayPagePersistence >> isStash [
^ false
Expand Down
5 changes: 5 additions & 0 deletions src/GT-Playground/GTUrlProvider.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -15,6 +15,11 @@ Class {
#category : #'GT-Playground'
}

{ #category : #testing }
GTUrlProvider class >> isDeprecated [
^ true
]

{ #category : #settings }
GTUrlProvider class >> settingsOn: aBuilder [
<systemsettings>
Expand Down
5 changes: 5 additions & 0 deletions src/GT-SUnitDebugger/GTSUnitActivationPredicate.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -7,6 +7,11 @@ Class {
#category : #'GT-SUnitDebugger'
}

{ #category : #testing }
GTSUnitActivationPredicate class >> isDeprecated [
^ true
]

{ #category : #testing }
GTSUnitActivationPredicate >> matchContext: aContext [

Expand Down
5 changes: 5 additions & 0 deletions src/GT-SUnitDebugger/GTSUnitDebugSession.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -32,6 +32,11 @@ GTSUnitDebugSession class >> activationPredicate [
^ GTSUnitActivationPredicate new
]

{ #category : #testing }
GTSUnitDebugSession class >> isDeprecated [
^ true
]

{ #category : #accessing }
GTSUnitDebugSession >> actualResult [

Expand Down
5 changes: 5 additions & 0 deletions src/GT-SUnitDebugger/GTSUnitDebuggerJumpToTestAction.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -16,6 +16,11 @@ GTSUnitDebuggerJumpToTestAction class >> gtDebuggerActionFor: aDebugger [
^ (self forDebugger: aDebugger)
]

{ #category : #testing }
GTSUnitDebuggerJumpToTestAction class >> isDeprecated [
^ true
]

{ #category : #testing }
GTSUnitDebuggerJumpToTestAction >> appliesToDebugger: aDebugger [

Expand Down
5 changes: 5 additions & 0 deletions src/GT-SUnitDebugger/GTSUnitExampleFailingTest.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -12,6 +12,11 @@ GTSUnitExampleFailingTest class >> isAbstract [
^ true
]

{ #category : #testing }
GTSUnitExampleFailingTest class >> isDeprecated [
^ true
]

{ #category : #testing }
GTSUnitExampleFailingTest class >> isUnitTest [
^ false
Expand Down
Original file line number Diff line number Diff line change
Expand Up @@ -12,6 +12,11 @@ GTSUnitExampleWithProblematicSetUpTest class >> isAbstract [
^ true
]

{ #category : #testing }
GTSUnitExampleWithProblematicSetUpTest class >> isDeprecated [
^ true
]

{ #category : #testing }
GTSUnitExampleWithProblematicSetUpTest class >> isUnitTest [
^ false
Expand Down
Loading

0 comments on commit e58ef49

Please sign in to comment.