{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DefaultSignatures #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE TypeApplications #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE TypeSynonymInstances #-}
module Data.Morpheus.Types.GQLType
( GQLType(..)
, TRUE
, FALSE
) where
import Data.Map (Map)
import Data.Proxy (Proxy (..))
import Data.Set (Set)
import Data.Text (Text, intercalate, pack)
import Data.Typeable (TyCon, TypeRep, Typeable, splitTyConApp, tyConFingerprint,
tyConName, typeRep, typeRepTyCon)
import Data.Morpheus.Kind
import Data.Morpheus.Types.Custom (MapKind, Pair)
import Data.Morpheus.Types.Internal.Data (DataFingerprint (..), QUERY)
import Data.Morpheus.Types.Internal.Resolver (Resolver (..))
import Data.Morpheus.Types.Types (Undefined (..))
type TRUE = 'True
type FALSE = 'False
resolverCon :: TyCon
resolverCon = typeRepTyCon $ typeRep $ Proxy @(Resolver QUERY Maybe)
replacePairCon :: TyCon -> TyCon
replacePairCon x
| hsPair == x = gqlPair
where
hsPair = typeRepTyCon $ typeRep $ Proxy @(Int, Int)
gqlPair = typeRepTyCon $ typeRep $ Proxy @(Pair Int Int)
replacePairCon x = x
ignoreResolver :: (TyCon, [TypeRep]) -> [TyCon]
ignoreResolver (con, _)
| con == resolverCon = []
ignoreResolver (con, args) = con : concatMap (ignoreResolver . splitTyConApp) args
class GQLType a where
type KIND a :: GQL_KIND
type KIND a = OBJECT
type CUSTOM a :: Bool
type CUSTOM a = FALSE
description :: Proxy a -> Maybe Text
description _ = Nothing
__typeName :: Proxy a -> Text
default __typeName :: (Typeable a) =>
Proxy a -> Text
__typeName _ = intercalate "_" (getName $ Proxy @a)
where
getName = fmap (map (pack . tyConName)) (map replacePairCon . ignoreResolver . splitTyConApp . typeRep)
__typeFingerprint :: Proxy a -> DataFingerprint
default __typeFingerprint :: (Typeable a) =>
Proxy a -> DataFingerprint
__typeFingerprint _ = TypeableFingerprint $ conFingerprints (Proxy @a)
where
conFingerprints = fmap (map tyConFingerprint) (ignoreResolver . splitTyConApp . typeRep)
instance GQLType () where
type KIND () = WRAPPER
type CUSTOM () = 'False
instance Typeable m => GQLType (Undefined m) where
type KIND (Undefined m) = WRAPPER
type CUSTOM (Undefined m) = 'False
instance GQLType Int where
type KIND Int = SCALAR
instance GQLType Float where
type KIND Float = SCALAR
instance GQLType Text where
type KIND Text = SCALAR
__typeName = const "String"
instance GQLType Bool where
type KIND Bool = SCALAR
__typeName = const "Boolean"
instance GQLType a => GQLType (Maybe a) where
type KIND (Maybe a) = WRAPPER
__typeName _ = __typeName (Proxy @a)
__typeFingerprint _ = __typeFingerprint (Proxy @a)
instance GQLType a => GQLType [a] where
type KIND [a] = WRAPPER
__typeName _ = __typeName (Proxy @a)
__typeFingerprint _ = __typeFingerprint (Proxy @a)
instance (Typeable a, Typeable b, GQLType a, GQLType b) => GQLType (a, b) where
type KIND (a, b) = WRAPPER
__typeName _ = __typeName $ Proxy @(Pair a b)
instance GQLType a => GQLType (Set a) where
type KIND (Set a) = WRAPPER
__typeName _ = __typeName (Proxy @a)
__typeFingerprint _ = __typeFingerprint (Proxy @a)
instance (Typeable a, Typeable b, GQLType a, GQLType b) => GQLType (Pair a b) where
type KIND (Pair a b) = OBJECT
instance (Typeable a, Typeable b, GQLType a, GQLType b) => GQLType (MapKind a b m) where
type KIND (MapKind a b m) = OBJECT
__typeName _ = __typeName (Proxy @(Map a b))
__typeFingerprint _ = __typeFingerprint (Proxy @(Map a b))
instance (Typeable k, Typeable v) => GQLType (Map k v) where
type KIND (Map k v) = WRAPPER
instance GQLType a => GQLType (Either s a) where
type KIND (Either s a) = WRAPPER
__typeName _ = __typeName (Proxy @a)
__typeFingerprint _ = __typeFingerprint (Proxy @a)
instance GQLType a => GQLType (Resolver o m e a) where
type KIND (Resolver o m e a) = WRAPPER
__typeName _ = __typeName (Proxy @a)
__typeFingerprint _ = __typeFingerprint (Proxy @a)
instance GQLType b => GQLType (a -> b) where
type KIND (a -> b) = WRAPPER
__typeName _ = __typeName (Proxy @b)
__typeFingerprint _ = __typeFingerprint (Proxy @b)