{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TypeApplications #-}
{-# OPTIONS_GHC -Wno-orphans #-}
module FreeC.Environment.ModuleInterface.Encoder ( writeModuleInterface ) where
import Control.Monad.IO.Class ( MonadIO )
import Data.Aeson ( (.=) )
import qualified Data.Aeson as Aeson
import Data.Maybe ( mapMaybe )
import qualified Data.Set as Set
import FreeC.Backend.Agda.Pretty
import qualified FreeC.Backend.Agda.Syntax as Agda
import FreeC.Backend.Coq.Pretty
import qualified FreeC.Backend.Coq.Syntax as Coq
import FreeC.Environment.Entry
import FreeC.Environment.ModuleInterface
import FreeC.IR.SrcSpan
import qualified FreeC.IR.Syntax as IR
import FreeC.LiftedIR.Effect
import FreeC.Monad.Reporter
import FreeC.Pretty
import FreeC.Util.Config
moduleInterfaceFileFormatVersion :: Integer
moduleInterfaceFileFormatVersion = 6
instance Aeson.ToJSON IR.QName where
toJSON = Aeson.toJSON . showPretty
instance Aeson.ToJSON IR.Type where
toJSON = Aeson.toJSON . showPretty
instance Aeson.ToJSON Coq.Qualid where
toJSON = Aeson.toJSON . showPretty . PrettyCoq
instance Aeson.ToJSON Agda.QName where
toJSON = Aeson.toJSON . show . prettyAgda
instance Aeson.ToJSON Effect where
toJSON = Aeson.toJSON . show
instance Aeson.ToJSON ModuleInterface where
toJSON iface = Aeson.object
[ "version" .= moduleInterfaceFileFormatVersion
, "module-name" .= Aeson.toJSON (interfaceModName iface)
, "library-name" .= Aeson.toJSON (interfaceLibName iface)
, "exported-types"
.= Aeson.toJSON (map snd (filter ((== IR.TypeScope) . fst)
(Set.toList (interfaceExports iface))))
, "exported-values"
.= Aeson.toJSON (map snd (filter ((== IR.ValueScope) . fst)
(Set.toList (interfaceExports iface))))
, "types" .= encodeEntriesWhere isDataEntry
, "type-synonyms" .= encodeEntriesWhere isTypeSynEntry
, "constructors" .= encodeEntriesWhere isConEntry
, "functions" .= encodeEntriesWhere isFuncEntry
]
where
encodeEntriesWhere :: (EnvEntry -> Bool) -> Aeson.Value
encodeEntriesWhere p = Aeson.toJSON
$ mapMaybe encodeEntry
$ Set.toList
$ Set.filter p
$ interfaceEntries iface
encodeEntry :: EnvEntry -> Maybe Aeson.Value
encodeEntry entry
| isDataEntry entry = return
$ Aeson.object [ "haskell-name" .= haskellName
, "coq-name" .= coqName
, "agda-name" .= agdaName
, "cons-names" .= consNames
, "arity" .= arity
]
| isTypeSynEntry entry = return
$ Aeson.object
[ "haskell-name" .= haskellName
, "coq-name" .= coqName
, "agda-name" .= agdaName
, "arity" .= arity
, "haskell-type" .= typeSyn
, "type-arguments" .= typeArgs
]
| isConEntry entry = return
$ Aeson.object
[ "haskell-type" .= haskellType
, "haskell-name" .= haskellName
, "coq-name" .= coqName
, "agda-name" .= agdaName
, "coq-smart-name" .= coqSmartName
, "agda-smart-name" .= agdaSmartName
, "arity" .= arity
]
| isFuncEntry entry = return
$ Aeson.object
[ "haskell-type" .= haskellType
, "haskell-name" .= haskellName
, "coq-name" .= coqName
, "agda-name" .= agdaName
, "arity" .= arity
, "strict-args" .= strictArgs
, "effects" .= effects
, "needs-free-args" .= freeArgsNeeded
, "encapsulates-effects" .= effectsEncapsulated
]
| otherwise = error "encodeEntry: Cannot serialize (type) variable entry."
where
haskellName :: Aeson.Value
haskellName = Aeson.toJSON (entryName entry)
coqName, coqSmartName :: Aeson.Value
coqName = Aeson.toJSON (entryIdent entry)
coqSmartName = Aeson.toJSON (entrySmartIdent entry)
agdaName, agdaSmartName :: Aeson.Value
agdaName = Aeson.toJSON @String "placeholder"
agdaSmartName = Aeson.toJSON @String "placeholder"
arity :: Aeson.Value
arity = Aeson.toJSON (entryArity entry)
consNames :: Aeson.Value
consNames = Aeson.toJSON (entryConsNames entry)
effects :: Aeson.Value
effects = Aeson.toJSON (entryEffects entry)
freeArgsNeeded :: Aeson.Value
freeArgsNeeded = Aeson.toJSON (entryNeedsFreeArgs entry)
effectsEncapsulated :: Aeson.Value
effectsEncapsulated = Aeson.toJSON (entryEncapsulatesEffects entry)
haskellType :: Aeson.Value
haskellType = Aeson.toJSON (foldr (IR.FuncType NoSrcSpan)
(entryReturnType entry) (entryArgTypes entry))
strictArgs :: Aeson.Value
strictArgs = Aeson.toJSON (entryStrictArgs entry)
typeSyn :: Aeson.Value
typeSyn = Aeson.toJSON (entryTypeSyn entry)
typeArgs :: Aeson.Value
typeArgs = Aeson.toJSON (entryTypeArgs entry)
writeModuleInterface
:: (MonadIO r, MonadReporter r) => FilePath -> ModuleInterface -> r ()
writeModuleInterface = saveConfig