| Safe Haskell | None |
|---|---|
| Language | Haskell98 |
Rest.Gen.Haskell.Generate
- lLibExposed :: forall cat. ArrowApply cat => Lens cat Library Bool
- lLibBuildInfo :: forall cat. ArrowApply cat => Lens cat Library BuildInfo
- lExposedModules :: forall cat. ArrowApply cat => Lens cat Library [ModuleName]
- lCondTreeData :: forall cat v c a. ArrowApply cat => Lens cat (CondTree v c a) a
- lCondTreeConstraints :: forall cat v c a. ArrowApply cat => Lens cat (CondTree v c a) c
- lCondTreeComponents :: forall cat v c a. ArrowApply cat => Lens cat (CondTree v c a) [(Condition v, CondTree v c a, Maybe (CondTree v c a))]
- lPackageDescription :: forall cat. ArrowApply cat => Lens cat GenericPackageDescription PackageDescription
- lGenPackageFlags :: forall cat. ArrowApply cat => Lens cat GenericPackageDescription [Flag]
- lCondTestSuites :: forall cat. ArrowApply cat => Lens cat GenericPackageDescription [(String, CondTree ConfVar [Dependency] TestSuite)]
- lCondLibrary :: forall cat. ArrowApply cat => Lens cat GenericPackageDescription (Maybe (CondTree ConfVar [Dependency] Library))
- lCondExecutables :: forall cat. ArrowApply cat => Lens cat GenericPackageDescription [(String, CondTree ConfVar [Dependency] Executable)]
- lCondBenchmarks :: forall cat. ArrowApply cat => Lens cat GenericPackageDescription [(String, CondTree ConfVar [Dependency] Benchmark)]
- data HaskellContext = HaskellContext {
- apiVersion :: Version
- targetPath :: String
- wrapperName :: String
- includePrivate :: Bool
- sources :: [String]
- imports :: [String]
- rewrites :: [(String, String)]
- namespace :: [String]
- mkHsApi :: HaskellContext -> Router m s -> IO ()
- mkCabalFile :: HaskellContext -> ApiResource -> IO ()
- writeCabalFile :: FilePath -> GenericPackageDescription -> IO ()
- updateExposedModules :: [ModuleName] -> GenericPackageDescription -> GenericPackageDescription
- mkGenericPackageDescription :: String -> [ModuleName] -> GenericPackageDescription
- mkCondLibrary :: [ModuleName] -> CondTree ConfVar [Dependency] Library
- writeRes :: HaskellContext -> ApiResource -> IO ()
- mkRes :: HaskellContext -> ApiResource -> String
- mkImports :: HaskellContext -> ApiResource -> [String] -> Code
- mkFunction :: [(String, String)] -> Version -> String -> ApiAction -> (Code, [String])
- linkToURL :: String -> Link -> (Code, [String])
- urlParts :: String -> Link -> ([Code], [String]) -> ([Code], [String])
- idData :: ApiResource -> Code
- mkHsName :: ActionInfo -> String
- rewriteModules :: [(String, String)] -> [String] -> [String]
- rewriteModule :: [(String, String)] -> [String] -> [String]
- hsName :: [String] -> String
- qualModName :: ResourceId -> String
- modPath :: ResourceId -> String
- modName :: String -> String
- dataName :: String -> String
- inputInfo :: [(String, String)] -> DataDescription -> ([String], String, String, String)
- outputInfo :: DataDescription -> ([String], String, String, String)
- errorInfo :: DataDescription -> ([String], String, String)
Documentation
lLibExposed :: forall cat. ArrowApply cat => Lens cat Library Bool Source
lLibBuildInfo :: forall cat. ArrowApply cat => Lens cat Library BuildInfo Source
lExposedModules :: forall cat. ArrowApply cat => Lens cat Library [ModuleName] Source
lCondTreeData :: forall cat v c a. ArrowApply cat => Lens cat (CondTree v c a) a Source
lCondTreeConstraints :: forall cat v c a. ArrowApply cat => Lens cat (CondTree v c a) c Source
lCondTreeComponents :: forall cat v c a. ArrowApply cat => Lens cat (CondTree v c a) [(Condition v, CondTree v c a, Maybe (CondTree v c a))] Source
lPackageDescription :: forall cat. ArrowApply cat => Lens cat GenericPackageDescription PackageDescription Source
lGenPackageFlags :: forall cat. ArrowApply cat => Lens cat GenericPackageDescription [Flag] Source
lCondTestSuites :: forall cat. ArrowApply cat => Lens cat GenericPackageDescription [(String, CondTree ConfVar [Dependency] TestSuite)] Source
lCondLibrary :: forall cat. ArrowApply cat => Lens cat GenericPackageDescription (Maybe (CondTree ConfVar [Dependency] Library)) Source
lCondExecutables :: forall cat. ArrowApply cat => Lens cat GenericPackageDescription [(String, CondTree ConfVar [Dependency] Executable)] Source
lCondBenchmarks :: forall cat. ArrowApply cat => Lens cat GenericPackageDescription [(String, CondTree ConfVar [Dependency] Benchmark)] Source
data HaskellContext Source
Constructors
| HaskellContext | |
Fields
| |
mkHsApi :: HaskellContext -> Router m s -> IO () Source
mkCabalFile :: HaskellContext -> ApiResource -> IO () Source
writeCabalFile :: FilePath -> GenericPackageDescription -> IO () Source
updateExposedModules :: [ModuleName] -> GenericPackageDescription -> GenericPackageDescription Source
mkCondLibrary :: [ModuleName] -> CondTree ConfVar [Dependency] Library Source
writeRes :: HaskellContext -> ApiResource -> IO () Source
mkRes :: HaskellContext -> ApiResource -> String Source
mkImports :: HaskellContext -> ApiResource -> [String] -> Code Source
idData :: ApiResource -> Code Source
mkHsName :: ActionInfo -> String Source
rewriteModules :: [(String, String)] -> [String] -> [String] Source
Rewrites multiple flattened module names
qualModName :: ResourceId -> String Source
modPath :: ResourceId -> String Source
outputInfo :: DataDescription -> ([String], String, String, String) Source