Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
SuppressUnusedWarnings (TyFun MyRoute [Piece Item] -> *) PlanSym0 | |
SuppressUnusedWarnings (k -> TyFun Crud [Piece k] -> *) (PlanCrudSym1 k) | |
SuppressUnusedWarnings (TyFun [Piece k] [k] -> *) (CapturesSym0 k) Source | |
SuppressUnusedWarnings (TyFun k (TyFun Crud [Piece k] -> *) -> *) (PlanCrudSym0 k) | |
data Sing (Piece a) where Source | |
type Apply [Piece Item] MyRoute PlanSym0 l0 = PlanSym1 l0 | |
type Apply (Piece k) k (CaptureSym0 k) s = CaptureSym1 k s Source | |
type Apply (Piece k) Symbol (StaticSym0 k) s = StaticSym1 k s Source | |
type Apply [Piece k] Crud (PlanCrudSym1 k l1) l0 = PlanCrudSym2 k l1 l0 | |
type Apply [k] [Piece k] (CapturesSym0 k) l0 = CapturesSym1 k l0 Source | |
type Apply (TyFun Crud [Piece k] -> *) k (PlanCrudSym0 k) l0 = PlanCrudSym1 k l0 |
type StaticSym1 s = Static s Source
type CaptureSym1 x = Capture x Source
data StaticSym0 :: TyFun Symbol (Piece k) -> * Source
type Apply (Piece k) Symbol (StaticSym0 k) s = StaticSym1 k s Source |
data CaptureSym0 :: TyFun k (Piece k) -> * Source
type Apply (Piece k) k (CaptureSym0 k) s = CaptureSym1 k s Source |
data CapturesSym0 l Source
forall arg . (KindOf (Apply CapturesSym0 arg) ~ KindOf (CapturesSym1 arg)) => CapturesSym0KindInference |
SuppressUnusedWarnings (TyFun [Piece k] [k] -> *) (CapturesSym0 k) Source | |
type Apply [k] [Piece k] (CapturesSym0 k) l0 = CapturesSym1 k l0 Source |
type CapturesSym1 t = Captures t Source
render :: Proxy f -> (forall route1. Sing route1 -> Sing (Apply f route1)) -> (forall x. Sing x -> Applied1 e x -> Text) -> Sing route -> Rec (Applied1 e) (Captures (Apply f route)) -> [Text] Source
renderPieces :: forall e pieces. (forall x. Sing x -> Applied1 e x -> Text) -> SList pieces -> Rec (Applied1 e) (Captures pieces) -> [Text] Source
renderSymbol :: forall s. SSymbol s -> Text Source
downgradeSList :: forall kproxy ks. (kproxy ~ KProxy) => SList ks -> [SomeSing kproxy] Source
parse :: forall kproxy e r. (kproxy ~ KProxy, SEnum kproxy, SBounded kproxy) => (forall x. Sing x -> Text -> Maybe (Applied1 e x)) -> (forall j. Sing j -> Sing (Apply r j)) -> [Text] -> Maybe (SomeSingWith1 kproxy (Results e r)) Source