Skip to content

Commit

Permalink
Revert unwished changes
Browse files Browse the repository at this point in the history
  • Loading branch information
hilaire committed Sep 28, 2019
1 parent c3bcdef commit 14680b0
Show file tree
Hide file tree
Showing 2 changed files with 16 additions and 12 deletions.
5 changes: 4 additions & 1 deletion src/EpiceaBrowsers/EpLogBrowserPresenter.class.st
Expand Up @@ -561,12 +561,15 @@ EpLogBrowserPresenter >> initializeWidgets [
itemsPresenter := self newList.
toolbarPresenter := self instantiate: EpLogBrowserToolbarPresenter.
entryContentPresenter := self newDiff.

itemsPresenter
beMultipleSelection;
display: [ :entryReference | self morphForItemAt: entryReference ];
displayBlock: [ :entryReference | self morphForItemAt: entryReference ];
whenSelectionChangedDo: [ self refreshEntryContentDeferrer schedule ];
contextMenu: [ self menuMorphForSelectedItems ].

toolbarPresenter logBrowserPresenter: self.

entryContentPresenter showOptions: false
]

Expand Down
Expand Up @@ -3,11 +3,8 @@ I command to launch the Abstract refactorings: create accessors and abstract the
"
Class {
#name : #SycAbstractAllInstVarAccessorsCommand,
#superclass : #CmdCommand,
#instVars : [
'variable'
],
#category : #'SystemCommands-VariableCommands'
#superclass : #SycClassCommand,
#category : #'SystemCommands-ClassCommands'
}

{ #category : #activation }
Expand All @@ -21,7 +18,7 @@ SycAbstractAllInstVarAccessorsCommand class >> browserShortcutActivation [
SycAbstractAllInstVarAccessorsCommand class >> fullBrowserMenuActivation [
<classAnnotation>

^CmdContextMenuActivation byRootGroupItemFor: ClyVariableContextOfFullBrowser
^CmdContextMenuActivation byRootGroupItemOrder: 2.1 for: ClyClassContextOfFullBrowser
]

{ #category : #activation }
Expand All @@ -33,9 +30,12 @@ SycAbstractAllInstVarAccessorsCommand class >> sourceCodeMenuActivation [

{ #category : #accessing }
SycAbstractAllInstVarAccessorsCommand >> asRefactorings [
^ {RBAbstractInstanceVariableRefactoring
variable: variable actualVariable name
class: variable definingClass}

| refactorings |
refactorings := classes flatCollect: [:eachClass |
eachClass slots collect: [:var |
var createRefactoring: RBAbstractInstanceVariableRefactoring for: eachClass]].
^ refactorings
]

{ #category : #accessing }
Expand All @@ -56,11 +56,12 @@ SycAbstractAllInstVarAccessorsCommand >> execute [

{ #category : #testing }
SycAbstractAllInstVarAccessorsCommand >> isComplexRefactoring [
^ true
^true
]

{ #category : #testing }
SycAbstractAllInstVarAccessorsCommand >> prepareFullExecutionInContext: aToolContext [
super prepareFullExecutionInContext: aToolContext.
variable := aToolContext lastSelectedVariable.

classes := classes collect: [:each | aToolContext currentMetaLevelOf: each]
]

0 comments on commit 14680b0

Please sign in to comment.