Skip to content

Commit

Permalink
Merge pull request #6545 from MarcusDenker/MoveVariablesToKernel
Browse files Browse the repository at this point in the history
Move Variables to Kernel
  • Loading branch information
MarcusDenker committed Jun 10, 2020
2 parents 97b6d4e + 1ba86f9 commit 982da21
Show file tree
Hide file tree
Showing 13 changed files with 18 additions and 18 deletions.
6 changes: 0 additions & 6 deletions src/Calypso-SystemQueries/LiteralVariable.extension.st
@@ -1,11 +1,5 @@
Extension { #name : #LiteralVariable }

{ #category : #'*Calypso-SystemQueries' }
LiteralVariable >> isReferencedIn: aMethod [

^(self isReadIn: aMethod) or: [ self isWrittenIn: aMethod ]
]

{ #category : #'*Calypso-SystemQueries' }
LiteralVariable >> printAsConstantQueryItem [
^self key
Expand Down
Expand Up @@ -12,7 +12,7 @@ AddionalBinding is used, too, by both Slots and Reflectivity to reference direct
Class {
#name : #AdditionalBinding,
#superclass : #LiteralVariable,
#category : #'Slot-Core-Variables'
#category : #'Kernel-Variables'
}

{ #category : #'code generation' }
Expand Down
Expand Up @@ -9,7 +9,7 @@ You can subclass me and implement #read and #write: for creating special kinds o
Class {
#name : #ClassVariable,
#superclass : #LiteralVariable,
#category : #'Slot-Core-Variables'
#category : #'Kernel-Variables'
}

{ #category : #printing }
Expand Down
Expand Up @@ -6,7 +6,7 @@ The compiler forwards bytecode generation to me for accessing the variable.
Class {
#name : #GlobalVariable,
#superclass : #LiteralVariable,
#category : #'Slot-Core-Variables'
#category : #'Kernel-Variables'
}

{ #category : #queries }
Expand Down
Expand Up @@ -9,7 +9,7 @@ Class {
#instVars : [
'index'
],
#category : #'Slot-Core-Variables'
#category : #'Kernel-Variables'
}

{ #category : #comparing }
Expand Down
Expand Up @@ -10,7 +10,7 @@ If you subclass this class, take note that as it overrides both #emitStore: and
Class {
#name : #InstanceVariableSlot,
#superclass : #IndexedSlot,
#category : #'Slot-Core-Variables'
#category : #'Kernel-Variables'
}

{ #category : #cleanup }
Expand Down
Expand Up @@ -18,7 +18,7 @@ Class {
#instVars : [
'value'
],
#category : #'Slot-Core-Variables'
#category : #'Kernel-Variables'
}

{ #category : #validating }
Expand Down Expand Up @@ -147,6 +147,12 @@ LiteralVariable >> isReferenced [
^false
]

{ #category : #queries }
LiteralVariable >> isReferencedIn: aMethod [

^(self isReadIn: aMethod) or: [ self isWrittenIn: aMethod ]
]

{ #category : #testing }
LiteralVariable >> isSelfEvaluating [
^ self key isSelfEvaluating and: [self value isSelfEvaluating]
Expand Down
Expand Up @@ -4,5 +4,5 @@ This subclass will model the class variables of SharedPool subclasses and thus p
Class {
#name : #PoolVariable,
#superclass : #ClassVariable,
#category : #'Slot-Core-Variables'
#category : #'Kernel-Variables'
}
2 changes: 1 addition & 1 deletion src/Slot-Core/Slot.class.st → src/Kernel/Slot.class.st
Expand Up @@ -32,7 +32,7 @@ Class {
#classInstVars : [
'slotClassDefinition'
],
#category : #'Slot-Core-Variables'
#category : #'Kernel-Variables'
}

{ #category : #'instance creation' }
Expand Down
Expand Up @@ -16,7 +16,7 @@ Class {
#classVars : [
'PersistentTemps'
],
#category : #'Slot-Core-Variables'
#category : #'Kernel-Variables'
}

{ #category : #'class initialization' }
Expand Down
Expand Up @@ -8,7 +8,7 @@ In future I can profice logging and user warning when evaluated code accesses un
Class {
#name : #UndeclaredVariable,
#superclass : #LiteralVariable,
#category : #'Slot-Core-Variables'
#category : #'Kernel-Variables'
}

{ #category : #queries }
Expand Down
Expand Up @@ -26,7 +26,7 @@ Class {
#classVars : [
'Properties'
],
#category : #'Slot-Core-Variables'
#category : #'Kernel-Variables'
}

{ #category : #'class initialization' }
Expand Down
Expand Up @@ -4,7 +4,7 @@ I am a binding in a Workspace. Used for non-defined temps
Class {
#name : #WorkspaceVariable,
#superclass : #LiteralVariable,
#category : #'Slot-Core-Variables'
#category : #'Kernel-Variables'
}

{ #category : #'code generation' }
Expand Down

0 comments on commit 982da21

Please sign in to comment.