Skip to content

Commit

Permalink
fixes #585
Browse files Browse the repository at this point in the history
  • Loading branch information
demarey committed Dec 21, 2022
1 parent 757db84 commit 8279a30
Show file tree
Hide file tree
Showing 2 changed files with 16 additions and 1 deletion.
5 changes: 4 additions & 1 deletion src/PharoLauncher-Core/PhLVmProviderUntilPharo80.class.st
Original file line number Diff line number Diff line change
Expand Up @@ -31,7 +31,10 @@ PhLVmProviderUntilPharo80 >> downloadPathOSTypeSegment [

{ #category : #'private - accessing' }
PhLVmProviderUntilPharo80 >> imageArchitecture [
^ vmManager is64bit ifTrue: [ '64' ] ifFalse: [ '' ]
" No 64-bit image before Pharo 6.0"
^ (vmManager is64bit and: [ vmManager pharoVersion > '50' ])
ifTrue: [ '64' ]
ifFalse: [ '' ]
]

{ #category : #private }
Expand Down
Original file line number Diff line number Diff line change
Expand Up @@ -25,3 +25,15 @@ PhLVmProviderUntilPharo80Test >> testUrlIsValidAndAvailable [
self assert: (url asString includesSubstring: '64').
self assert: (ZnEasy head: url) isSuccess
]

{ #category : #tests }
PhLVmProviderUntilPharo80Test >> testUrlIsValidAndAvailableWhenOs64BitAndImageAvailableOnlyIn32Bits [
| url vm |
vm := (PhLVirtualMachine id: '40-x86').
vmProvider := PhLVmProvider for: vm.
url := vmProvider url.

self assert: (url asString includesSubstring: '40').
self deny: (url asString includesSubstring: '64').
self assert: (ZnEasy head: url) isSuccess
]

0 comments on commit 8279a30

Please sign in to comment.