Skip to content
This repository was archived by the owner on Oct 19, 2024. It is now read-only.

Commit 2009aee

Browse files
serrasFlavio Corpa
and
Flavio Corpa
authored
New API to support GraphQL resolvers as services (#111)
Co-authored-by: Flavio Corpa <[email protected]>
1 parent fd6025b commit 2009aee

File tree

52 files changed

+1315
-357
lines changed

Some content is hidden

Large Commits have some content hidden by default. Use the searchbox below for content that may be hidden.

52 files changed

+1315
-357
lines changed

adapter/avro/src/Mu/Adapter/Avro.hs

+3-3
Original file line numberDiff line numberDiff line change
@@ -197,7 +197,7 @@ instance (HasAvroSchema' (FieldValue f sch t), A.FromAvro (FieldValue f sch t))
197197
fromAvro v = TSimple <$> A.fromAvro v
198198

199199
instance A.FromAvro (FieldValue f sch 'TNull) where
200-
fromAvro AVal.Null = return FNull
200+
fromAvro AVal.Null = pure FNull
201201
fromAvro v = A.badValue v "null"
202202
instance A.FromAvro t => A.FromAvro (FieldValue f sch ('TPrimitive t)) where
203203
fromAvro v = FPrimitive <$> A.fromAvro v
@@ -228,7 +228,7 @@ class FromAvroEnum (vs :: [ChoiceDef fn]) where
228228
instance FromAvroEnum '[] where
229229
fromAvroEnum v _ = A.badValue v "element not found"
230230
instance FromAvroEnum vs => FromAvroEnum (v ': vs) where
231-
fromAvroEnum _ 0 = return (Z Proxy)
231+
fromAvroEnum _ 0 = pure (Z Proxy)
232232
fromAvroEnum v n = S <$> fromAvroEnum v (n-1)
233233

234234
class FromAvroUnion f sch choices where
@@ -246,7 +246,7 @@ instance (A.FromAvro (FieldValue f sch u), FromAvroUnion f sch us)
246246
class FromAvroFields f sch (fs :: [FieldDef Symbol Symbol]) where
247247
fromAvroF :: HM.HashMap T.Text (AVal.Value ASch.Schema) -> A.Result (NP (Field f sch) fs)
248248
instance FromAvroFields f sch '[] where
249-
fromAvroF _ = return Nil
249+
fromAvroF _ = pure Nil
250250
instance (Applicative f, KnownName name, A.FromAvro (FieldValue f sch t), FromAvroFields f sch fs)
251251
=> FromAvroFields f sch ('FieldDef name t ': fs) where
252252
fromAvroF v = case HM.lookup fieldName v of

adapter/avro/src/Mu/Quasi/Avro.hs

+10-8
Original file line numberDiff line numberDiff line change
@@ -88,13 +88,15 @@ avdlToDecls schemaName serviceName protocol
8888
serviceName' = mkName serviceName
8989
schemaDec <- tySynD schemaName' [] (schemaFromAvro $ S.toList (A.types protocol))
9090
serviceDec <- tySynD serviceName' []
91-
[t| 'Service $(textToStrLit (A.pname protocol)) $(pkgType (A.ns protocol))
92-
$(typesToList <$> mapM (avroMethodToType schemaName') (S.toList $ A.messages protocol)) |]
93-
return [schemaDec, serviceDec]
91+
[t| 'Package $(pkgType (A.ns protocol))
92+
'[ 'Service $(textToStrLit (A.pname protocol)) '[]
93+
$(typesToList <$> mapM (avroMethodToType schemaName')
94+
(S.toList $ A.messages protocol)) ] |]
95+
pure [schemaDec, serviceDec]
9496
where
95-
pkgType Nothing = [t| '[] |]
97+
pkgType Nothing = [t| 'Nothing |]
9698
pkgType (Just (A.Namespace p))
97-
= [t| '[ Package $(textToStrLit (T.intercalate "." p)) ] |]
99+
= [t| 'Just $(textToStrLit (T.intercalate "." p)) |]
98100

99101
schemaFromAvro :: [A.Schema] -> Q Type
100102
schemaFromAvro =
@@ -181,20 +183,20 @@ avroMethodToType schemaName m
181183
where
182184
argToType :: A.Argument -> Q Type
183185
argToType (A.Argument (A.NamedType a) _)
184-
= [t| 'ArgSingle ('ViaSchema $(conT schemaName) $(textToStrLit (A.baseName a))) |]
186+
= [t| 'ArgSingle ('SchemaRef $(conT schemaName) $(textToStrLit (A.baseName a))) |]
185187
argToType (A.Argument _ _)
186188
= fail "only named types may be used as arguments"
187189

188190
retToType :: A.Schema -> Q Type
189191
retToType A.Null
190192
= [t| 'RetNothing |]
191193
retToType (A.NamedType a)
192-
= [t| 'RetSingle ('ViaSchema $(conT schemaName) $(textToStrLit (A.baseName a))) |]
194+
= [t| 'RetSingle ('SchemaRef $(conT schemaName) $(textToStrLit (A.baseName a))) |]
193195
retToType _
194196
= fail "only named types may be used as results"
195197

196198
typesToList :: [Type] -> Type
197199
typesToList = foldr (\y ys -> AppT (AppT PromotedConsT y) ys) PromotedNilT
198200

199201
textToStrLit :: T.Text -> Q Type
200-
textToStrLit s = return $ LitT $ StrTyLit $ T.unpack s
202+
textToStrLit s = litT $ strTyLit $ T.unpack s

adapter/protobuf/src/Mu/Adapter/ProtoBuf.hs

+2-2
Original file line numberDiff line numberDiff line change
@@ -225,7 +225,7 @@ instance ProtoBridgeTerm w sch ('DRecord name args)
225225
t <- PBDec.embedded (protoToTerm @_ @_ @w @sch @('DRecord name args))
226226
case t of
227227
Nothing -> PBDec.Parser (\_ -> Left (PBDec.WireTypeError "expected message"))
228-
Just v -> return v
228+
Just v -> pure v
229229
embedProtoToOneFieldValue = PBDec.embedded' (protoToTerm @_ @_ @w @sch @('DRecord name args))
230230

231231
-- ENUMERATIONS
@@ -256,7 +256,7 @@ instance (KnownNat (FindProtoBufId sch ty c), ProtoBridgeEnum sch ty cs)
256256
where enumValue = fromIntegral (natVal (Proxy @(FindProtoBufId sch ty c)))
257257
enumToProto fid (S v) = enumToProto @_ @_ @sch @ty fid v
258258
protoToEnum n
259-
| n == enumValue = return (Z Proxy)
259+
| n == enumValue = pure (Z Proxy)
260260
| otherwise = S <$> protoToEnum @_ @_ @sch @ty n
261261
where enumValue = fromIntegral (natVal (Proxy @(FindProtoBufId sch ty c)))
262262

adapter/protobuf/src/Mu/Adapter/ProtoBuf/Via.hs

+9-9
Original file line numberDiff line numberDiff line change
@@ -28,11 +28,11 @@ import Mu.Schema
2828

2929
-- | Specifies that a type is turned into a Protocol Buffers
3030
-- message by using the schema as intermediate representation.
31-
newtype ViaToProtoBufTypeRef (ref :: TypeRef) t
31+
newtype ViaToProtoBufTypeRef (ref :: TypeRef snm) t
3232
= ViaToProtoBufTypeRef { unViaToProtoBufTypeRef :: t }
3333
-- | Specifies that a type can be parsed from a Protocol Buffers
3434
-- message by using the schema as intermediate representation.
35-
newtype ViaFromProtoBufTypeRef (ref :: TypeRef) t
35+
newtype ViaFromProtoBufTypeRef (ref :: TypeRef snm) t
3636
= ViaFromProtoBufTypeRef { unViaFromProtoBufTypeRef :: t }
3737

3838
instance ToProtoBufTypeRef ref t
@@ -46,29 +46,29 @@ instance FromProtoBufTypeRef ref t
4646

4747
instance Proto3WireEncoder () where
4848
proto3WireEncode _ = mempty
49-
proto3WireDecode = return ()
49+
proto3WireDecode = pure ()
5050

5151
-- | Types which can be parsed from a Protocol Buffers message.
52-
class FromProtoBufTypeRef (ref :: TypeRef) t where
52+
class FromProtoBufTypeRef (ref :: TypeRef snm) t where
5353
fromProtoBufTypeRef :: Proxy ref -> PBDec.Parser PBDec.RawMessage t
5454
-- | Types which can be turned into a Protocol Buffers message.
55-
class ToProtoBufTypeRef (ref :: TypeRef) t where
55+
class ToProtoBufTypeRef (ref :: TypeRef snm) t where
5656
toProtoBufTypeRef :: Proxy ref -> t -> PBEnc.MessageBuilder
5757

5858
instance (IsProtoSchema Maybe sch sty, FromSchema Maybe sch sty t)
59-
=> FromProtoBufTypeRef ('ViaSchema sch sty) t where
59+
=> FromProtoBufTypeRef ('SchemaRef sch sty) t where
6060
fromProtoBufTypeRef _ = fromProtoViaSchema @_ @_ @sch
6161
instance (IsProtoSchema Maybe sch sty, ToSchema Maybe sch sty t)
62-
=> ToProtoBufTypeRef ('ViaSchema sch sty) t where
62+
=> ToProtoBufTypeRef ('SchemaRef sch sty) t where
6363
toProtoBufTypeRef _ = toProtoViaSchema @_ @_ @sch
6464

6565
instance ( FromProtoBufRegistry r t
6666
, IsProtoSchema Maybe (MappingRight r last) sty
6767
, FromSchema Maybe (MappingRight r last) sty t )
68-
=> FromProtoBufTypeRef ('ViaRegistry r t last) t where
68+
=> FromProtoBufTypeRef ('RegistryRef r t last) t where
6969
fromProtoBufTypeRef _ = fromProtoBufWithRegistry @r
7070
instance ( FromProtoBufRegistry r t
7171
, IsProtoSchema Maybe (MappingRight r last) sty
7272
, ToSchema Maybe (MappingRight r last) sty t )
73-
=> ToProtoBufTypeRef ('ViaRegistry r t last) t where
73+
=> ToProtoBufTypeRef ('RegistryRef r t last) t where
7474
toProtoBufTypeRef _ = toProtoViaSchema @_ @_ @(MappingRight r last)

adapter/protobuf/src/Mu/Quasi/GRpc.hs

+12-11
Original file line numberDiff line numberDiff line change
@@ -60,7 +60,7 @@ grpcToDecls schemaName servicePrefix [email protected] { P.package = pkg, P.services
6060
= do let schemaName' = mkName schemaName
6161
schemaDec <- protobufToDecls schemaName p
6262
serviceTy <- mapM (pbServiceDeclToDec servicePrefix pkg schemaName') srvs
63-
return (schemaDec ++ serviceTy)
63+
pure (schemaDec ++ serviceTy)
6464

6565
pbServiceDeclToDec :: (String -> String) -> Maybe [T.Text] -> Name -> P.ServiceDeclaration -> Q Dec
6666
pbServiceDeclToDec servicePrefix pkg schema srv@(P.Service nm _ _)
@@ -69,11 +69,12 @@ pbServiceDeclToDec servicePrefix pkg schema srv@(P.Service nm _ _)
6969

7070
pbServiceDeclToType :: Maybe [T.Text] -> Name -> P.ServiceDeclaration -> Q Type
7171
pbServiceDeclToType pkg schema (P.Service nm _ methods)
72-
= [t| 'Service $(textToStrLit nm) $(pkgType pkg)
73-
$(typesToList <$> mapM (pbMethodToType schema) methods) |]
72+
= [t| 'Package $(pkgType pkg)
73+
'[ 'Service $(textToStrLit nm) '[]
74+
$(typesToList <$> mapM (pbMethodToType schema) methods) ] |]
7475
where
75-
pkgType Nothing = [t| '[] |]
76-
pkgType (Just p) = [t| '[ Package $(textToStrLit (T.intercalate "." p)) ] |]
76+
pkgType Nothing = [t| 'Nothing |]
77+
pkgType (Just p) = [t| 'Just $(textToStrLit (T.intercalate "." p)) |]
7778

7879
pbMethodToType :: Name -> P.Method -> Q Type
7980
pbMethodToType s (P.Method nm vr v rr r _)
@@ -83,27 +84,27 @@ pbMethodToType s (P.Method nm vr v rr r _)
8384
argToType P.Single (P.TOther ["google","protobuf","Empty"])
8485
= [t| '[ ] |]
8586
argToType P.Single (P.TOther a)
86-
= [t| '[ 'ArgSingle ('ViaSchema $(schemaTy s) $(textToStrLit (last a))) ] |]
87+
= [t| '[ 'ArgSingle ('SchemaRef $(schemaTy s) $(textToStrLit (last a))) ] |]
8788
argToType P.Stream (P.TOther a)
88-
= [t| '[ 'ArgStream ('ViaSchema $(schemaTy s) $(textToStrLit (last a))) ] |]
89+
= [t| '[ 'ArgStream ('SchemaRef $(schemaTy s) $(textToStrLit (last a))) ] |]
8990
argToType _ _
9091
= fail "only message types may be used as arguments"
9192

9293
retToType P.Single (P.TOther ["google","protobuf","Empty"])
9394
= [t| 'RetNothing |]
9495
retToType P.Single (P.TOther a)
95-
= [t| 'RetSingle ('ViaSchema $(schemaTy s) $(textToStrLit (last a))) |]
96+
= [t| 'RetSingle ('SchemaRef $(schemaTy s) $(textToStrLit (last a))) |]
9697
retToType P.Stream (P.TOther a)
97-
= [t| 'RetStream ('ViaSchema $(schemaTy s) $(textToStrLit (last a))) |]
98+
= [t| 'RetStream ('SchemaRef $(schemaTy s) $(textToStrLit (last a))) |]
9899
retToType _ _
99100
= fail "only message types may be used as results"
100101

101102
schemaTy :: Name -> Q Type
102-
schemaTy schema = return $ ConT schema
103+
schemaTy schema = pure $ ConT schema
103104

104105
typesToList :: [Type] -> Type
105106
typesToList
106107
= foldr (\y ys -> AppT (AppT PromotedConsT y) ys) PromotedNilT
107108
textToStrLit :: T.Text -> Q Type
108109
textToStrLit s
109-
= return $ LitT $ StrTyLit $ T.unpack s
110+
= pure $ LitT $ StrTyLit $ T.unpack s

adapter/protobuf/src/Mu/Quasi/ProtoBuf.hs

+9-9
Original file line numberDiff line numberDiff line change
@@ -26,8 +26,8 @@ import Language.ProtocolBuffers.Parser
2626
import qualified Language.ProtocolBuffers.Types as P
2727

2828
import Mu.Adapter.ProtoBuf
29-
import Mu.Schema.Definition
3029
import Mu.Schema.Annotations
30+
import Mu.Schema.Definition
3131

3232
-- | Reads a @.proto@ file and generates a 'Mu.Schema.Definition.Schema'
3333
-- with all the message types, using the name given
@@ -46,22 +46,22 @@ protobufToDecls :: String -> P.ProtoBuf -> Q [Dec]
4646
protobufToDecls schemaName p
4747
= do let schemaName' = mkName schemaName
4848
(schTy, annTy) <- schemaFromProtoBuf p
49-
schemaDec <- tySynD schemaName' [] (return schTy)
49+
schemaDec <- tySynD schemaName' [] (pure schTy)
5050
#if MIN_VERSION_template_haskell(2,15,0)
5151
annDec <- tySynInstD (tySynEqn Nothing
5252
[t| AnnotatedSchema ProtoBufAnnotation $(conT schemaName') |]
53-
(return annTy))
53+
(pure annTy))
5454
#else
5555
annDec <- tySynInstD ''AnnotatedSchema
56-
(tySynEqn [ [t| ProtoBufAnnotation |], conT schemaName' ] (return annTy))
56+
(tySynEqn [ [t| ProtoBufAnnotation |], conT schemaName' ] (pure annTy))
5757
#endif
58-
return [schemaDec, annDec]
58+
pure [schemaDec, annDec]
5959

6060
schemaFromProtoBuf :: P.ProtoBuf -> Q (Type, Type)
6161
schemaFromProtoBuf P.ProtoBuf {P.types = tys} = do
6262
let decls = flattenDecls tys
6363
(schTys, anns) <- unzip <$> mapM pbTypeDeclToType decls
64-
return (typesToList schTys, typesToList (concat anns))
64+
pure (typesToList schTys, typesToList (concat anns))
6565

6666
flattenDecls :: [P.TypeDeclaration] -> [P.TypeDeclaration]
6767
flattenDecls = concatMap flattenDecl
@@ -73,7 +73,7 @@ flattenDecls = concatMap flattenDecl
7373
pbTypeDeclToType :: P.TypeDeclaration -> Q (Type, [Type])
7474
pbTypeDeclToType (P.DEnum name _ fields) = do
7575
(tys, anns) <- unzip <$> mapM pbChoiceToType fields
76-
(,) <$> [t|'DEnum $(textToStrLit name) $(return $ typesToList tys)|] <*> pure anns
76+
(,) <$> [t|'DEnum $(textToStrLit name) $(pure $ typesToList tys)|] <*> pure anns
7777
where
7878
pbChoiceToType :: P.EnumField -> Q (Type, Type)
7979
pbChoiceToType (P.EnumField nm number _)
@@ -138,7 +138,7 @@ typesToList :: [Type] -> Type
138138
typesToList = foldr (\y ys -> AppT (AppT PromotedConsT y) ys) PromotedNilT
139139

140140
textToStrLit :: T.Text -> Q Type
141-
textToStrLit s = return $ LitT $ StrTyLit $ T.unpack s
141+
textToStrLit s = pure $ LitT $ StrTyLit $ T.unpack s
142142

143143
intToLit :: Int -> Q Type
144-
intToLit n = return $ LitT $ NumTyLit $ toInteger n
144+
intToLit n = pure $ LitT $ NumTyLit $ toInteger n

cabal-fmt.sh

100644100755
+1-1
Original file line numberDiff line numberDiff line change
@@ -1 +1 @@
1-
find . -name '*.cabal' -exec sh -c 'cabal-fmt $0 > output.tmp; mv output.tmp $0' {} ';'
1+
find . -name '*.cabal' -exec sh -c 'cabal-fmt -i $0' {} ';'

cabal.project

+1
Original file line numberDiff line numberDiff line change
@@ -16,3 +16,4 @@ packages: compendium-client/
1616
grpc/common/
1717
grpc/client/
1818
grpc/server/
19+
graphql/

compendium-client/src/Compendium/Client.hs

+3-3
Original file line numberDiff line numberDiff line change
@@ -79,8 +79,8 @@ obtainProtoBuf m url ident = do
7979
r <- transformation m url ident Protobuf
8080
case r of
8181
Left e
82-
-> return $ Left (OPEClient e)
82+
-> pure $ Left (OPEClient e)
8383
Right p
8484
-> case parseProtoBuf p of
85-
Left e -> return $ Left (OPEParse e)
86-
Right pb -> return $ Right pb
85+
Left e -> pure $ Left (OPEParse e)
86+
Right pb -> pure $ Right pb

0 commit comments

Comments
 (0)