graphql-engine/server/tests-hspec/Test/LongIdentifiersSpec.hs
Gil Mizrahi c08bb5377f server/tests-hspec: porting more tests to fixture
PR-URL: https://github.com/hasura/graphql-engine-mono/pull/5404
GitOrigin-RevId: 0be4f50b17765a8f0b1fb37944777ead7ec6bfc9
2022-08-10 20:38:39 +00:00

196 lines
6.3 KiB
Haskell

{-# LANGUAGE QuasiQuotes #-}
-- | Test long identifiers
--
-- See "Hasura.Backend.Postgres.SQL.RenameIdentifiers" for more details.
module Test.LongIdentifiersSpec (spec) where
import Harness.Backend.BigQuery qualified as BigQuery
import Harness.Backend.Postgres qualified as Postgres
import Harness.Backend.Sqlserver qualified as Sqlserver
import Harness.GraphqlEngine qualified as GraphqlEngine
import Harness.Quoter.Graphql (graphql)
import Harness.Quoter.Yaml (interpolateYaml)
import Harness.Test.Fixture qualified as Fixture
import Harness.Test.Schema (Table (..), table)
import Harness.Test.Schema qualified as Schema
import Harness.TestEnvironment (TestEnvironment)
import Harness.Yaml (shouldReturnYaml)
import Hasura.Prelude
import Test.Hspec (SpecWith, it)
--------------------------------------------------------------------------------
-- Preamble
spec :: SpecWith TestEnvironment
spec = do
Fixture.run
[ -- Create table fails currently becasuse we postfix table names for some reason
-- which makes the valid table name go over the limit
--
-- (Fixture.fixture $ Fixture.Backend Fixture.MySQL)
-- { Fixture.setupTeardown = \(testEnv, _) ->
-- [ Mysql.setupTablesAction schema testEnv
-- ]
-- },
(Fixture.fixture $ Fixture.Backend Fixture.Postgres)
{ Fixture.setupTeardown = \(testEnv, _) ->
[ Postgres.setupTablesAction schema testEnv
]
},
-- Create table fails currently on a weird error:
-- > relation "i_need_a_table_with_a_long_na_i_need_a_column_with_a_long_n_seq" already exists
--
-- (Fixture.fixture $ Fixture.Backend Fixture.Citus)
-- { Fixture.setupTeardown = \(testEnv, _) ->
-- [ Citus.setupTablesAction schema testEnv
-- ]
-- },
(Fixture.fixture $ Fixture.Backend Fixture.SQLServer)
{ Fixture.setupTeardown = \(testEnv, _) ->
[ Sqlserver.setupTablesAction schema testEnv
]
},
(Fixture.fixture $ Fixture.Backend Fixture.BigQuery)
{ Fixture.setupTeardown = \(testEnv, _) ->
[ BigQuery.setupTablesAction schema testEnv
],
Fixture.customOptions =
Just $
Fixture.Options
{ stringifyNumbers = True
}
}
]
tests
--------------------------------------------------------------------------------
-- Schema
schema :: [Schema.Table]
schema = [regular, longtable]
regular :: Schema.Table
regular =
(table "regular")
{ tableColumns =
[ Schema.column "id" Schema.TInt,
Schema.column "name" Schema.TStr
],
tablePrimaryKey = ["id"],
tableData =
[ [Schema.VInt 1, Schema.VStr "Author 1"],
[Schema.VInt 2, Schema.VStr "Author 2"]
]
}
longtable :: Schema.Table
longtable =
(table "i_need_a_table_with_a_long_name_to_test_rename_identifiers") -- 58 characters
{ tableColumns =
[ Schema.column "id" Schema.TInt,
Schema.column "regular_id" Schema.TInt,
Schema.column "i_need_a_column_with_a_long_name_to_test_rename_identifiers" Schema.TInt, -- 59 characters
Schema.column "i_need_a_column_with_a_long_name_but_is_different" Schema.TInt -- 49 characters
],
tablePrimaryKey = ["id"],
tableReferences =
[ Schema.Reference
{ referenceLocalColumn = "regular_id",
referenceTargetTable = "regular",
referenceTargetColumn = "id"
}
],
tableData =
[ [Schema.VInt 1, Schema.VInt 1, Schema.VInt 1, Schema.VInt 1],
[Schema.VInt 2, Schema.VInt 2, Schema.VInt 2, Schema.VInt 2]
]
}
--------------------------------------------------------------------------------
-- Tests
tests :: Fixture.Options -> SpecWith TestEnvironment
tests opts = do
it "select long table" $ \testEnvironment -> do
let schemaName = Schema.getSchemaName testEnvironment
shouldReturnYaml
opts
( GraphqlEngine.postGraphql
testEnvironment
[graphql|
query {
#{schemaName}_i_need_a_table_with_a_long_name_to_test_rename_identifiers(order_by:[{id:asc}]) {
id
}
}
|]
)
[interpolateYaml|
data:
#{schemaName}_i_need_a_table_with_a_long_name_to_test_rename_identifiers:
- id: 1
- id: 2
|]
it "select long column" $ \testEnvironment -> do
let schemaName = Schema.getSchemaName testEnvironment
shouldReturnYaml
opts
( GraphqlEngine.postGraphql
testEnvironment
[interpolateYaml|
query {
#{schemaName}_i_need_a_table_with_a_long_name_to_test_rename_identifiers(order_by:[{i_need_a_column_with_a_long_name_to_test_rename_identifiers:asc, i_need_a_column_with_a_long_name_but_is_different:asc}]) {
id
regular_id
i_need_a_column_with_a_long_name_to_test_rename_identifiers
}
}
|]
)
[interpolateYaml|
data:
#{schemaName}_i_need_a_table_with_a_long_name_to_test_rename_identifiers:
- id: 1
regular_id: 1
i_need_a_column_with_a_long_name_to_test_rename_identifiers: 1
- id: 2
regular_id: 2
i_need_a_column_with_a_long_name_to_test_rename_identifiers: 2
|]
it "select long column via array relationship" $ \testEnvironment -> do
let schemaName = Schema.getSchemaName testEnvironment
shouldReturnYaml
opts
( GraphqlEngine.postGraphql
testEnvironment
[interpolateYaml|
query {
#{schemaName}_regular(order_by:[{id:asc}]) {
id
i_need_a_table_with_a_long_name_to_test_rename_identifierss_by_id_to_regular_id(order_by:[{i_need_a_column_with_a_long_name_to_test_rename_identifiers:asc, i_need_a_column_with_a_long_name_but_is_different:asc}]) {
i_need_a_column_with_a_long_name_to_test_rename_identifiers
i_need_a_column_with_a_long_name_but_is_different
}
}
}
|]
)
[interpolateYaml|
data:
#{schemaName}_regular:
- id: 1
i_need_a_table_with_a_long_name_to_test_rename_identifierss_by_id_to_regular_id:
- i_need_a_column_with_a_long_name_to_test_rename_identifiers: 1
i_need_a_column_with_a_long_name_but_is_different: 1
- id: 2
i_need_a_table_with_a_long_name_to_test_rename_identifierss_by_id_to_regular_id:
- i_need_a_column_with_a_long_name_to_test_rename_identifiers: 2
i_need_a_column_with_a_long_name_but_is_different: 2
|]