{-# LANGUAGE CPP #-}
{-# LANGUAGE TemplateHaskell #-}
module Data.API.Tools.CBOR
( cborTool
) where
import Data.API.TH
import Data.API.Tools.Combinators
import Data.API.Tools.Datatypes
import Data.API.Tools.Enum
import Data.API.Types
import Control.Applicative
import qualified Control.Monad.Fail as Fail
import Codec.Serialise.Class
import Codec.Serialise.Decoding
import Codec.Serialise.Encoding
import Data.Binary.Serialise.CBOR.Extra
import Data.List (foldl', sortBy)
import qualified Data.Map as Map
import Data.Monoid
import Data.Ord (comparing)
import qualified Data.Text as T
import Language.Haskell.TH
import Prelude
cborTool :: APITool
cborTool :: APITool
cborTool = Tool APINode -> APITool
apiNodeTool (Tool APINode -> APITool) -> Tool APINode -> APITool
forall a b. (a -> b) -> a -> b
$
Tool (APINode, SpecNewtype)
-> Tool (APINode, SpecRecord)
-> Tool (APINode, SpecUnion)
-> Tool (APINode, SpecEnum)
-> Tool (APINode, APIType)
-> Tool APINode
apiSpecTool Tool (APINode, SpecNewtype)
gen_sn_to Tool (APINode, SpecRecord)
gen_sr_to Tool (APINode, SpecUnion)
gen_su_to Tool (APINode, SpecEnum)
gen_se_to Tool (APINode, APIType)
forall a. Monoid a => a
mempty
Tool APINode -> Tool APINode -> Tool APINode
forall a. Semigroup a => a -> a -> a
<> Tool APINode
gen_pr
gen_sn_to :: Tool (APINode, SpecNewtype)
gen_sn_to :: Tool (APINode, SpecNewtype)
gen_sn_to = (ToolSettings -> (APINode, SpecNewtype) -> Q [Dec])
-> Tool (APINode, SpecNewtype)
forall a. (ToolSettings -> a -> Q [Dec]) -> Tool a
mkTool ((ToolSettings -> (APINode, SpecNewtype) -> Q [Dec])
-> Tool (APINode, SpecNewtype))
-> (ToolSettings -> (APINode, SpecNewtype) -> Q [Dec])
-> Tool (APINode, SpecNewtype)
forall a b. (a -> b) -> a -> b
$ \ ToolSettings
ts (APINode
an, SpecNewtype
sn) -> ToolSettings -> Name -> [TypeQ] -> [DecQ] -> Q [Dec]
optionalInstanceD ToolSettings
ts ''Serialise [APINode -> TypeQ
nodeRepT APINode
an]
[ Name -> ExpQ -> DecQ
simpleD 'encode (APINode -> SpecNewtype -> ExpQ
bdy_in APINode
an SpecNewtype
sn)
, Name -> ExpQ -> DecQ
simpleD 'decode (ToolSettings -> APINode -> SpecNewtype -> ExpQ
bdy_out ToolSettings
ts APINode
an SpecNewtype
sn)]
where
bdy_in :: APINode -> SpecNewtype -> ExpQ
bdy_in APINode
an SpecNewtype
sn = [e| $(SpecNewtype -> ExpQ
forall {m :: * -> *}. Quote m => SpecNewtype -> m Exp
ine SpecNewtype
sn) . $(APINode -> ExpQ
newtypeProjectionE APINode
an) |]
bdy_out :: ToolSettings -> APINode -> SpecNewtype -> ExpQ
bdy_out ToolSettings
ts APINode
an SpecNewtype
sn = [e| $(ToolSettings -> APINode -> SpecNewtype -> ExpQ
nodeNewtypeConE ToolSettings
ts APINode
an SpecNewtype
sn) <$> $(SpecNewtype -> ExpQ
forall {m :: * -> *}. Quote m => SpecNewtype -> m Exp
oute SpecNewtype
sn) |]
ine :: SpecNewtype -> m Exp
ine SpecNewtype
sn = case SpecNewtype -> BasicType
snType SpecNewtype
sn of
BasicType
BTstring -> [e| encodeString |]
BasicType
BTbinary -> [e| encode |]
BasicType
BTbool -> [e| encodeBool |]
BasicType
BTint -> [e| encodeInt |]
BasicType
BTutc -> [e| encode |]
oute :: SpecNewtype -> m Exp
oute SpecNewtype
sn =
case SpecNewtype -> BasicType
snType SpecNewtype
sn of
BasicType
BTstring -> [e| decodeString |]
BasicType
BTbinary -> [e| decode |]
BasicType
BTbool -> [e| decodeBool |]
BasicType
BTint -> [e| decodeInt |]
BasicType
BTutc -> [e| decode |]
gen_sr_to :: Tool (APINode, SpecRecord)
gen_sr_to :: Tool (APINode, SpecRecord)
gen_sr_to = (ToolSettings -> (APINode, SpecRecord) -> Q [Dec])
-> Tool (APINode, SpecRecord)
forall a. (ToolSettings -> a -> Q [Dec]) -> Tool a
mkTool ((ToolSettings -> (APINode, SpecRecord) -> Q [Dec])
-> Tool (APINode, SpecRecord))
-> (ToolSettings -> (APINode, SpecRecord) -> Q [Dec])
-> Tool (APINode, SpecRecord)
forall a b. (a -> b) -> a -> b
$ \ ToolSettings
ts (APINode
an, SpecRecord
sr) ->
ToolSettings -> Name -> [TypeQ] -> [DecQ] -> Q [Dec]
optionalInstanceD ToolSettings
ts ''Serialise [APINode -> TypeQ
nodeRepT APINode
an] [ Name -> ExpQ -> DecQ
simpleD 'encode (APINode -> SpecRecord -> ExpQ
bdy_in APINode
an SpecRecord
sr)
, Name -> ExpQ -> DecQ
simpleD 'decode (APINode -> SpecRecord -> ExpQ
cl APINode
an SpecRecord
sr)
]
where
bdy_in :: APINode -> SpecRecord -> ExpQ
bdy_in APINode
an SpecRecord
sr =
let fields :: [(FieldName, FieldType)]
fields = SpecRecord -> [(FieldName, FieldType)]
sortFields SpecRecord
sr
len :: Integer
len = Int -> Integer
forall a b. (Integral a, Num b) => a -> b
fromIntegral ([(FieldName, FieldType)] -> Int
forall a. [a] -> Int
forall (t :: * -> *) a. Foldable t => t a -> Int
length [(FieldName, FieldType)]
fields)
lenE :: ExpQ
lenE = Name -> ExpQ
forall (m :: * -> *). Quote m => Name -> m Exp
varE 'fromIntegral
ExpQ -> ExpQ -> ExpQ
forall (m :: * -> *). Quote m => m Exp -> m Exp -> m Exp
`appE` (ExpQ -> TypeQ -> ExpQ
forall (m :: * -> *). Quote m => m Exp -> m Type -> m Exp
sigE (Lit -> ExpQ
forall (m :: * -> *). Quote m => Lit -> m Exp
litE (Integer -> Lit
integerL Integer
len))
(Name -> TypeQ
forall (m :: * -> *). Quote m => Name -> m Type
conT ''Integer))
writeRecordHeader :: ExpQ
writeRecordHeader = Name -> ExpQ
forall (m :: * -> *). Quote m => Name -> m Exp
varE 'encodeMapLen ExpQ -> ExpQ -> ExpQ
forall (m :: * -> *). Quote m => m Exp -> m Exp -> m Exp
`appE` ExpQ
lenE
encFields :: ExpQ
encFields =
Name -> ExpQ
forall (m :: * -> *). Quote m => Name -> m Exp
varE 'encodeRecordFields ExpQ -> ExpQ -> ExpQ
forall (m :: * -> *). Quote m => m Exp -> m Exp -> m Exp
`appE`
[ExpQ] -> ExpQ
forall (m :: * -> *). Quote m => [m Exp] -> m Exp
listE [ [e| encodeString $(FieldName -> ExpQ
fieldNameE FieldName
fn)
<> encode $(APINode -> FieldName -> ExpQ
nodeFieldE APINode
an FieldName
fn) |]
| (FieldName
fn, FieldType
_fty) <- [(FieldName, FieldType)]
fields ]
in [Q Pat] -> ExpQ -> ExpQ
forall (m :: * -> *). Quote m => [m Pat] -> m Exp -> m Exp
lamE [APINode -> [Q Pat] -> Q Pat
nodeConP APINode
an [APINode -> FieldName -> Q Pat
nodeFieldP APINode
an FieldName
fn | (FieldName
fn, FieldType
_) <- SpecRecord -> [(FieldName, FieldType)]
srFields SpecRecord
sr ]] (ExpQ -> ExpQ) -> ExpQ -> ExpQ
forall a b. (a -> b) -> a -> b
$
Name -> ExpQ
forall (m :: * -> *). Quote m => Name -> m Exp
varE '(<>)
ExpQ -> ExpQ -> ExpQ
forall (m :: * -> *). Quote m => m Exp -> m Exp -> m Exp
`appE` ExpQ
writeRecordHeader
ExpQ -> ExpQ -> ExpQ
forall (m :: * -> *). Quote m => m Exp -> m Exp -> m Exp
`appE` ExpQ
encFields
cl :: APINode -> SpecRecord -> ExpQ
cl APINode
an SpecRecord
sr = Name -> ExpQ
forall (m :: * -> *). Quote m => Name -> m Exp
varE '(>>)
ExpQ -> ExpQ -> ExpQ
forall (m :: * -> *). Quote m => m Exp -> m Exp -> m Exp
`appE` (Name -> ExpQ
forall (m :: * -> *). Quote m => Name -> m Exp
varE 'decodeMapLen)
ExpQ -> ExpQ -> ExpQ
forall (m :: * -> *). Quote m => m Exp -> m Exp -> m Exp
`appE` ExpQ
bdy
where
sorted_fields :: [FieldName]
sorted_fields = ((FieldName, FieldType) -> FieldName)
-> [(FieldName, FieldType)] -> [FieldName]
forall a b. (a -> b) -> [a] -> [b]
map (FieldName, FieldType) -> FieldName
forall a b. (a, b) -> a
fst ([(FieldName, FieldType)] -> [FieldName])
-> [(FieldName, FieldType)] -> [FieldName]
forall a b. (a -> b) -> a -> b
$ SpecRecord -> [(FieldName, FieldType)]
sortFields SpecRecord
sr
original_fields :: [FieldName]
original_fields = ((FieldName, FieldType) -> FieldName)
-> [(FieldName, FieldType)] -> [FieldName]
forall a b. (a -> b) -> [a] -> [b]
map (FieldName, FieldType) -> FieldName
forall a b. (a, b) -> a
fst ([(FieldName, FieldType)] -> [FieldName])
-> [(FieldName, FieldType)] -> [FieldName]
forall a b. (a -> b) -> a -> b
$ SpecRecord -> [(FieldName, FieldType)]
srFields SpecRecord
sr
bdy :: ExpQ
bdy = ExpQ -> [ExpQ] -> ExpQ
applicativeE ExpQ
dataCon ([ExpQ] -> ExpQ) -> [ExpQ] -> ExpQ
forall a b. (a -> b) -> a -> b
$ (FieldName -> ExpQ) -> [FieldName] -> [ExpQ]
forall a b. (a -> b) -> [a] -> [b]
map FieldName -> ExpQ
forall {m :: * -> *} {p}. Quote m => p -> m Exp
project [FieldName]
sorted_fields
project :: p -> m Exp
project p
_fn = [e| decodeString >> decode |]
dataCon :: ExpQ
dataCon | [FieldName]
sorted_fields [FieldName] -> [FieldName] -> Bool
forall a. Eq a => a -> a -> Bool
== [FieldName]
original_fields = APINode -> ExpQ
nodeConE APINode
an
| Bool
otherwise = [Q Pat] -> ExpQ -> ExpQ
forall (m :: * -> *). Quote m => [m Pat] -> m Exp -> m Exp
lamE ((FieldName -> Q Pat) -> [FieldName] -> [Q Pat]
forall a b. (a -> b) -> [a] -> [b]
map (APINode -> FieldName -> Q Pat
nodeFieldP APINode
an) [FieldName]
sorted_fields)
((ExpQ -> ExpQ -> ExpQ) -> ExpQ -> [ExpQ] -> ExpQ
forall b a. (b -> a -> b) -> b -> [a] -> b
forall (t :: * -> *) b a.
Foldable t =>
(b -> a -> b) -> b -> t a -> b
foldl' ExpQ -> ExpQ -> ExpQ
forall (m :: * -> *). Quote m => m Exp -> m Exp -> m Exp
appE (APINode -> ExpQ
nodeConE APINode
an) ((FieldName -> ExpQ) -> [FieldName] -> [ExpQ]
forall a b. (a -> b) -> [a] -> [b]
map (APINode -> FieldName -> ExpQ
nodeFieldE APINode
an) [FieldName]
original_fields))
sortFields :: SpecRecord -> [(FieldName, FieldType)]
sortFields SpecRecord
sr = ((FieldName, FieldType) -> (FieldName, FieldType) -> Ordering)
-> [(FieldName, FieldType)] -> [(FieldName, FieldType)]
forall a. (a -> a -> Ordering) -> [a] -> [a]
sortBy (((FieldName, FieldType) -> FieldName)
-> (FieldName, FieldType) -> (FieldName, FieldType) -> Ordering
forall a b. Ord a => (b -> a) -> b -> b -> Ordering
comparing (FieldName, FieldType) -> FieldName
forall a b. (a, b) -> a
fst) ([(FieldName, FieldType)] -> [(FieldName, FieldType)])
-> [(FieldName, FieldType)] -> [(FieldName, FieldType)]
forall a b. (a -> b) -> a -> b
$ SpecRecord -> [(FieldName, FieldType)]
srFields SpecRecord
sr
gen_su_to :: Tool (APINode, SpecUnion)
gen_su_to :: Tool (APINode, SpecUnion)
gen_su_to = (ToolSettings -> (APINode, SpecUnion) -> Q [Dec])
-> Tool (APINode, SpecUnion)
forall a. (ToolSettings -> a -> Q [Dec]) -> Tool a
mkTool ((ToolSettings -> (APINode, SpecUnion) -> Q [Dec])
-> Tool (APINode, SpecUnion))
-> (ToolSettings -> (APINode, SpecUnion) -> Q [Dec])
-> Tool (APINode, SpecUnion)
forall a b. (a -> b) -> a -> b
$ \ ToolSettings
ts (APINode
an, SpecUnion
su) -> ToolSettings -> Name -> [TypeQ] -> [DecQ] -> Q [Dec]
optionalInstanceD ToolSettings
ts ''Serialise [APINode -> TypeQ
nodeRepT APINode
an]
[ Name -> [Q Clause] -> DecQ
forall (m :: * -> *). Quote m => Name -> [m Clause] -> m Dec
funD 'encode (APINode -> SpecUnion -> [Q Clause]
cls APINode
an SpecUnion
su)
, Name -> ExpQ -> DecQ
simpleD 'decode (APINode -> SpecUnion -> ExpQ
bdy_out APINode
an SpecUnion
su)
]
where
cls :: APINode -> SpecUnion -> [Q Clause]
cls APINode
an SpecUnion
su = ((FieldName, (APIType, MDComment)) -> Q Clause)
-> [(FieldName, (APIType, MDComment))] -> [Q Clause]
forall a b. (a -> b) -> [a] -> [b]
map (APINode -> (FieldName, (APIType, MDComment)) -> Q Clause
forall {a} {b}. APINode -> (FieldName, (a, b)) -> Q Clause
cl APINode
an) (SpecUnion -> [(FieldName, (APIType, MDComment))]
suFields SpecUnion
su)
cl :: APINode -> (FieldName, (a, b)) -> Q Clause
cl APINode
an (FieldName
fn, (a
_ty, b
_)) = do
Name
x <- MDComment -> Q Name
forall (m :: * -> *). Quote m => MDComment -> m Name
newName MDComment
"x"
[Q Pat] -> Q Body -> [DecQ] -> Q Clause
forall (m :: * -> *).
Quote m =>
[m Pat] -> m Body -> [m Dec] -> m Clause
clause [APINode -> FieldName -> [Q Pat] -> Q Pat
nodeAltConP APINode
an FieldName
fn [Name -> Q Pat
forall (m :: * -> *). Quote m => Name -> m Pat
varP Name
x]] (FieldName -> Name -> Q Body
bdy FieldName
fn Name
x) []
bdy :: FieldName -> Name -> Q Body
bdy FieldName
fn Name
x = ExpQ -> Q Body
forall (m :: * -> *). Quote m => m Exp -> m Body
normalB [e| encodeUnion $(FieldName -> ExpQ
fieldNameE FieldName
fn) (encode $(Name -> ExpQ
forall (m :: * -> *). Quote m => Name -> m Exp
varE Name
x)) |]
bdy_out :: APINode -> SpecUnion -> ExpQ
bdy_out APINode
an SpecUnion
su = Name -> ExpQ
forall (m :: * -> *). Quote m => Name -> m Exp
varE 'decodeUnion ExpQ -> ExpQ -> ExpQ
forall (m :: * -> *). Quote m => m Exp -> m Exp -> m Exp
`appE` [ExpQ] -> ExpQ
forall (m :: * -> *). Quote m => [m Exp] -> m Exp
listE (((FieldName, (APIType, MDComment)) -> ExpQ)
-> [(FieldName, (APIType, MDComment))] -> [ExpQ]
forall a b. (a -> b) -> [a] -> [b]
map (APINode -> (FieldName, (APIType, MDComment)) -> ExpQ
forall {b}. APINode -> (FieldName, b) -> ExpQ
alt APINode
an) (SpecUnion -> [(FieldName, (APIType, MDComment))]
suFields SpecUnion
su))
alt :: APINode -> (FieldName, b) -> ExpQ
alt APINode
an (FieldName
fn, b
_) = [e| ( $(FieldName -> ExpQ
fieldNameE FieldName
fn) , fmap $(APINode -> FieldName -> ExpQ
nodeAltConE APINode
an FieldName
fn) decode ) |]
gen_se_to :: Tool (APINode, SpecEnum)
gen_se_to :: Tool (APINode, SpecEnum)
gen_se_to = (ToolSettings -> (APINode, SpecEnum) -> Q [Dec])
-> Tool (APINode, SpecEnum)
forall a. (ToolSettings -> a -> Q [Dec]) -> Tool a
mkTool ((ToolSettings -> (APINode, SpecEnum) -> Q [Dec])
-> Tool (APINode, SpecEnum))
-> (ToolSettings -> (APINode, SpecEnum) -> Q [Dec])
-> Tool (APINode, SpecEnum)
forall a b. (a -> b) -> a -> b
$ \ ToolSettings
ts (APINode
an, SpecEnum
_se) -> ToolSettings -> Name -> [TypeQ] -> [DecQ] -> Q [Dec]
optionalInstanceD ToolSettings
ts ''Serialise [APINode -> TypeQ
nodeRepT APINode
an]
[ Name -> ExpQ -> DecQ
simpleD 'encode (APINode -> ExpQ
forall {m :: * -> *}. Quote m => APINode -> m Exp
bdy_in APINode
an)
, Name -> ExpQ -> DecQ
simpleD 'decode (APINode -> ExpQ
forall {m :: * -> *}. Quote m => APINode -> m Exp
bdy_out APINode
an)
]
where
bdy_in :: APINode -> m Exp
bdy_in APINode
an = [e| encodeString . $(Name -> m Exp
forall (m :: * -> *). Quote m => Name -> m Exp
varE (APINode -> Name
text_enum_nm APINode
an)) |]
bdy_out :: APINode -> m Exp
bdy_out APINode
an = [e| decodeString >>= cborStrMap_p $(Name -> m Exp
forall (m :: * -> *). Quote m => Name -> m Exp
varE (APINode -> Name
map_enum_nm APINode
an)) |]
cborStrMap_p :: (Fail.MonadFail m, Ord a) => Map.Map T.Text a -> T.Text -> m a
cborStrMap_p :: forall (m :: * -> *) a.
(MonadFail m, Ord a) =>
Map Text a -> Text -> m a
cborStrMap_p Map Text a
mp Text
t = case Text -> Map Text a -> Maybe a
forall k a. Ord k => k -> Map k a -> Maybe a
Map.lookup Text
t Map Text a
mp of
Maybe a
Nothing -> MDComment -> m a
forall a. MDComment -> m a
forall (m :: * -> *) a. MonadFail m => MDComment -> m a
fail MDComment
"Unexpected enumeration key in CBOR"
Just a
r -> a -> m a
forall a. a -> m a
forall (m :: * -> *) a. Monad m => a -> m a
return a
r
gen_pr :: Tool APINode
gen_pr :: Tool APINode
gen_pr = (ToolSettings -> APINode -> Q [Dec]) -> Tool APINode
forall a. (ToolSettings -> a -> Q [Dec]) -> Tool a
mkTool ((ToolSettings -> APINode -> Q [Dec]) -> Tool APINode)
-> (ToolSettings -> APINode -> Q [Dec]) -> Tool APINode
forall a b. (a -> b) -> a -> b
$ \ ToolSettings
ts APINode
an -> case APINode -> Conversion
anConvert APINode
an of
Conversion
Nothing -> [Dec] -> Q [Dec]
forall a. a -> Q a
forall (m :: * -> *) a. Monad m => a -> m a
return []
Just (FieldName
inj_fn, FieldName
prj_fn) -> ToolSettings -> Name -> [TypeQ] -> [DecQ] -> Q [Dec]
optionalInstanceD ToolSettings
ts ''Serialise [APINode -> TypeQ
nodeT APINode
an] [ Name -> ExpQ -> DecQ
simpleD 'encode ExpQ
bdy_in
, Name -> ExpQ -> DecQ
simpleD 'decode ExpQ
bdy_out
]
where
bdy_in :: ExpQ
bdy_in = [e| encode . $(FieldName -> ExpQ
fieldNameVarE FieldName
prj_fn) |]
bdy_out :: ExpQ
bdy_out = [e| decode >>= $(FieldName -> ExpQ
fieldNameVarE FieldName
inj_fn) |]