Hoogle Search
Within LTS Haskell 24.28 (ghc-9.10.3)
Note that Stackage only displays results for the latest LTS and Nightly snapshot. Learn more.
deriveTypeScript :: Options -> Name -> Q [Dec]aeson-typescript Data.Aeson.TypeScript.TH Generates a TypeScript instance declaration for the given data type.
deriveTypeScript' :: Options -> Name -> ExtraTypeScriptOptions -> Q [Dec]aeson-typescript Data.Aeson.TypeScript.TH Generates a TypeScript instance declaration for the given data type.
deriveTypeScriptLookupType :: Name -> String -> Q [Dec]aeson-typescript Data.Aeson.TypeScript.TH Generates a TypeScript declaration for a closed type family as a lookup type.
deriveApiFieldJSON :: Name -> Q [Dec]api-field-json-th Data.Aeson.APIFieldJsonTH レコード名を落としてjsonインスタンス化
deriveTermLiteral :: Name -> Q [Dec]clash-lib Clash.Core.TermLiteral Derive a TermLiteral instance for given type
deriveShowsTypePrec :: Name -> Q Decclash-lib Clash.Core.TermLiteral.TH For Maybe, constructs:
showsTypePrec n _ = let showSpace = showChar ' ' precCalls = [showsTypePrec 11 (Proxy @a)] interspersedPrecCalls = intersperse showSpace precCalls showType = foldl (.) (showString "Maybe") (showSpace : interspersedPrecCalls) in showParen (n > 10) showType
deriveTermLiteral :: Name -> Q [Dec]clash-lib Clash.Core.TermLiteral.TH Derive a TermLiteral instance for given type
deriveTermToData :: Name -> Q Expclash-lib Clash.Core.TermLiteral.TH No documentation available.
deriveConjurable :: Name -> DecsQcode-conjure Conjure Derives an Conjurable instance for the given type Name. If not already present, this also derives Listable, Express and Name instances. If the Data.Express' type binding operators (-:, ->: or ->>:) are not in scope, this derives them as well. This function needs the TemplateHaskell extension. You can place the following at the top of the file:
{-# LANGUAGE TemplateHaskell #-} import Conjure import Test.LeanCheckThen just call deriveConjurable after your data type declaration:data Peano = Z | S Peano deriving (Show, Eq) deriveConjurable ''Peano
deriveConjurable expects the argument type to be an instance of Show and Eq.deriveConjurableCascading :: Name -> DecsQcode-conjure Conjure Derives a Conjurable instance for a given type Name cascading derivation of type arguments as well.