Skip to content

Commit

Permalink
Subclasses of TestCase should end with Test and not Tests. Fix it for…
Browse files Browse the repository at this point in the history
… UFFI.
  • Loading branch information
jecisc committed Aug 3, 2019
1 parent 5f48771 commit 4d62976
Show file tree
Hide file tree
Showing 19 changed files with 175 additions and 175 deletions.
Expand Up @@ -2,7 +2,7 @@
This TestSuite evaluates the correct implementation of the callback parameter extraction.
"
Class {
#name : #FFICallbackParametersTests,
#name : #FFICallbackParametersTest,
#superclass : #TestCase,
#instVars : [
'callback'
Expand All @@ -17,7 +17,7 @@ Class {
}

{ #category : #executing }
FFICallbackParametersTests >> callCallback: aFFICallback withArgs: aCollection [
FFICallbackParametersTest >> callCallback: aFFICallback withArgs: aCollection [

^ (ExternalLibraryFunction
name: nil
Expand All @@ -33,7 +33,7 @@ FFICallbackParametersTests >> callCallback: aFFICallback withArgs: aCollection [
]

{ #category : #running }
FFICallbackParametersTests >> testCharacterParameters [
FFICallbackParametersTest >> testCharacterParameters [

| params |
params := (1 to: 6) collect: [ :i | i asCharacter ].
Expand All @@ -54,7 +54,7 @@ FFICallbackParametersTests >> testCharacterParameters [
]

{ #category : #running }
FFICallbackParametersTests >> testFloatParameters [
FFICallbackParametersTest >> testFloatParameters [

callback := FFICallback
signature: #(double (double a, double b, float c, float d, double e, float f))
Expand All @@ -72,7 +72,7 @@ FFICallbackParametersTests >> testFloatParameters [
]

{ #category : #running }
FFICallbackParametersTests >> testIdentityStruct [
FFICallbackParametersTest >> testIdentityStruct [

<expectedFailure>

Expand Down Expand Up @@ -105,7 +105,7 @@ FFICallbackParametersTests >> testIdentityStruct [
]

{ #category : #running }
FFICallbackParametersTests >> testIntegerParameters [
FFICallbackParametersTest >> testIntegerParameters [

callback := FFICallback
signature: #(int (int, int, int, int, int, int))
Expand All @@ -125,7 +125,7 @@ FFICallbackParametersTests >> testIntegerParameters [
]

{ #category : #running }
FFICallbackParametersTests >> testIntegerPointerParameters [
FFICallbackParametersTest >> testIntegerPointerParameters [

| params |
params := (1 to: 6) collect: [ :i | ExternalAddress fromAddress: i ].
Expand All @@ -145,7 +145,7 @@ FFICallbackParametersTests >> testIntegerPointerParameters [
]

{ #category : #running }
FFICallbackParametersTests >> testMixingParameters [
FFICallbackParametersTest >> testMixingParameters [

callback := FFICallback
signature: #(void (int a, float b, char c, int d, double e, int f, char g))
Expand All @@ -163,7 +163,7 @@ FFICallbackParametersTests >> testMixingParameters [
]

{ #category : #running }
FFICallbackParametersTests >> testPassing2DoubleStructureInTheStack [
FFICallbackParametersTest >> testPassing2DoubleStructureInTheStack [

| param |
callback := FFICallback
Expand All @@ -185,7 +185,7 @@ FFICallbackParametersTests >> testPassing2DoubleStructureInTheStack [
]

{ #category : #running }
FFICallbackParametersTests >> testPassing2Int64StructureInTheStack [
FFICallbackParametersTest >> testPassing2Int64StructureInTheStack [

| param |
callback := FFICallback
Expand All @@ -207,7 +207,7 @@ FFICallbackParametersTests >> testPassing2Int64StructureInTheStack [
]

{ #category : #running }
FFICallbackParametersTests >> testPassing4DoubleStructureInTheStack [
FFICallbackParametersTest >> testPassing4DoubleStructureInTheStack [

| param |
callback := FFICallback
Expand Down Expand Up @@ -238,7 +238,7 @@ FFICallbackParametersTests >> testPassing4DoubleStructureInTheStack [
]

{ #category : #running }
FFICallbackParametersTests >> testPassing4Int64StructureInTheStack [
FFICallbackParametersTest >> testPassing4Int64StructureInTheStack [

| param |
callback := FFICallback
Expand All @@ -264,7 +264,7 @@ FFICallbackParametersTests >> testPassing4Int64StructureInTheStack [
]

{ #category : #running }
FFICallbackParametersTests >> testPassing4IntStructureInTheStack [
FFICallbackParametersTest >> testPassing4IntStructureInTheStack [

| param |
callback := FFICallback
Expand All @@ -290,7 +290,7 @@ FFICallbackParametersTests >> testPassing4IntStructureInTheStack [
]

{ #category : #running }
FFICallbackParametersTests >> testPassingStructureInTheStack [
FFICallbackParametersTest >> testPassingStructureInTheStack [

| param |
callback := FFICallback
Expand Down
Expand Up @@ -2,7 +2,7 @@
Tests for callbacks
"
Class {
#name : #FFICallbackTests,
#name : #FFICallbackTest,
#superclass : #TestCase,
#pools : [
'FFITestEnumeration'
Expand All @@ -11,22 +11,22 @@ Class {
}

{ #category : #accessing }
FFICallbackTests >> floatregargsp [
FFICallbackTest >> floatregargsp [
^ nil
]

{ #category : #accessing }
FFICallbackTests >> intregargsp [
FFICallbackTest >> intregargsp [
^ nil
]

{ #category : #running }
FFICallbackTests >> runCaseManaged [
FFICallbackTest >> runCaseManaged [
^ self runCase
]

{ #category : #tests }
FFICallbackTests >> testCqsort [
FFICallbackTest >> testCqsort [
| unsorted expected values callback results |

self flag: #TODO. "TEMPORAL... I need to see why this is crashing on windows (but callbacks are
Expand Down Expand Up @@ -55,7 +55,7 @@ FFICallbackTests >> testCqsort [
]

{ #category : #tests }
FFICallbackTests >> testCqsortWithByteArray [
FFICallbackTest >> testCqsortWithByteArray [
| unsorted expected values callback results |

self flag: #TODO. "TEMPORAL... I need to see why this is crashing on windows (but callbacks are
Expand Down Expand Up @@ -85,7 +85,7 @@ FFICallbackTests >> testCqsortWithByteArray [
]

{ #category : #tests }
FFICallbackTests >> testEnumerationReturnValue [
FFICallbackTest >> testEnumerationReturnValue [
| cb returnValue |
"Issue 19145 - change semantics so that enumerations can be returned
from callback without sending #value to it."
Expand All @@ -107,7 +107,7 @@ FFICallbackTests >> testEnumerationReturnValue [
]

{ #category : #support }
FFICallbackTests >> wordResult: anInteger [
FFICallbackTest >> wordResult: anInteger [
"For testEnumerationReturnValue, simulate a method invoked
from FFICallback>>valueInContext, so that I can be passed as a fake context."
^anInteger
Expand Down

0 comments on commit 4d62976

Please sign in to comment.