File tree 2 files changed +8
-8
lines changed
2 files changed +8
-8
lines changed Original file line number Diff line number Diff line change @@ -433,6 +433,13 @@ CogX64Compiler >> canZeroExtend [
433
433
^ true
434
434
]
435
435
436
+ { #category : ' testing' }
437
+ CogX64Compiler >> checkIs32bit: offset [
438
+
439
+ (offset between: - 2147483648 and : 2147483647 ) ifFalse: [
440
+ self error: ' Cannot jump to distances larger than 32 bits' ]
441
+ ]
442
+
436
443
{ #category : ' accessing' }
437
444
CogX64Compiler >> cmpC32RTempByteSize [
438
445
^ 5
@@ -4276,13 +4283,6 @@ CogX64Compiler >> is32BitSignedImmediate: a64BitUnsignedOperand [
4276
4283
inSmalltalk: [((a64BitUnsignedOperand >> 32 ) signedIntFromLong + 1 bitXor: 1 ) = (a64BitUnsignedOperand >> 31 bitAnd: 1 )]
4277
4284
]
4278
4285
4279
- { #category : ' testing' }
4280
- CogX64Compiler >> checkIs32bit: offset [
4281
-
4282
- (offset between: - 2147483648 and : 2147483647 ) ifFalse: [
4283
- self error: ' Cannot jump to distances larger than 32 bits' ]
4284
- ]
4285
-
4286
4286
{ #category : ' testing' }
4287
4287
CogX64Compiler >> isAddressRelativeToVarBase: varAddress [
4288
4288
" Support for addressing variables off the dedicated VarBaseReg. Allow for 1Mb of variables.
Original file line number Diff line number Diff line change @@ -3738,7 +3738,7 @@ StackToRegisterMappingCogit >> populate: tuple withPICInfoFor: cPIC firstCacheTa
3738
3738
picCaseMachineCodePC := self addressOfEndOfCase: i inCPIC: cPIC.
3739
3739
cacheTag := i = 1
3740
3740
ifTrue: [firstCacheTag]
3741
- ifFalse: [backEnd literalBeforeFollowingAddress : picCaseMachineCodePC - backEnd jumpLongConditionalByteSize].
3741
+ ifFalse: [backEnd literal32BeforeFollowingAddress : picCaseMachineCodePC - backEnd jumpLongConditionalByteSize].
3742
3742
3743
3743
classOop := objectRepresentation classForInlineCacheTag: cacheTag.
3744
3744
objectMemory storePointer: i * 2 - 1 ofObject: tuple withValue: classOop.
You can’t perform that action at this time.
0 commit comments