biscuit-haskell-0.2.2.0: Library support for the Biscuit security token
Copyright© Clément Delafargue 2021
LicenseMIT
Maintainerclement@delafargue.name
Safe HaskellNone
LanguageHaskell2010

Auth.Biscuit.Proto

Description

Haskell data structures mapping the biscuit protobuf definitions

Synopsis

Documentation

data Biscuit Source #

Instances

Instances details
Show Biscuit Source # 
Instance details

Defined in Auth.Biscuit.Proto

Generic Biscuit Source # 
Instance details

Defined in Auth.Biscuit.Proto

Associated Types

type Rep Biscuit :: Type -> Type #

Methods

from :: Biscuit -> Rep Biscuit x #

to :: Rep Biscuit x -> Biscuit #

Decode Biscuit Source # 
Instance details

Defined in Auth.Biscuit.Proto

Encode Biscuit Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

encode :: Biscuit -> Put #

type Rep Biscuit Source # 
Instance details

Defined in Auth.Biscuit.Proto

data SignedBlock Source #

Instances

Instances details
Show SignedBlock Source # 
Instance details

Defined in Auth.Biscuit.Proto

Generic SignedBlock Source # 
Instance details

Defined in Auth.Biscuit.Proto

Associated Types

type Rep SignedBlock :: Type -> Type #

Decode SignedBlock Source # 
Instance details

Defined in Auth.Biscuit.Proto

Encode SignedBlock Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

encode :: SignedBlock -> Put #

type Rep SignedBlock Source # 
Instance details

Defined in Auth.Biscuit.Proto

type Rep SignedBlock = D1 ('MetaData "SignedBlock" "Auth.Biscuit.Proto" "biscuit-haskell-0.2.2.0-inplace" 'False) (C1 ('MetaCons "SignedBlock" 'PrefixI 'True) (S1 ('MetaSel ('Just "block") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Required 1 (Value ByteString))) :*: (S1 ('MetaSel ('Just "nextKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Required 2 (Message PublicKey))) :*: S1 ('MetaSel ('Just "signature") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Required 3 (Value ByteString))))))

data PublicKey Source #

Instances

Instances details
Show PublicKey Source # 
Instance details

Defined in Auth.Biscuit.Proto

Generic PublicKey Source # 
Instance details

Defined in Auth.Biscuit.Proto

Associated Types

type Rep PublicKey :: Type -> Type #

Decode PublicKey Source # 
Instance details

Defined in Auth.Biscuit.Proto

Encode PublicKey Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

encode :: PublicKey -> Put #

type Rep PublicKey Source # 
Instance details

Defined in Auth.Biscuit.Proto

type Rep PublicKey = D1 ('MetaData "PublicKey" "Auth.Biscuit.Proto" "biscuit-haskell-0.2.2.0-inplace" 'False) (C1 ('MetaCons "PublicKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "algorithm") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Required 1 (Enumeration Algorithm))) :*: S1 ('MetaSel ('Just "key") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Required 2 (Value ByteString)))))

data Proof Source #

Instances

Instances details
Show Proof Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

showsPrec :: Int -> Proof -> ShowS #

show :: Proof -> String #

showList :: [Proof] -> ShowS #

Generic Proof Source # 
Instance details

Defined in Auth.Biscuit.Proto

Associated Types

type Rep Proof :: Type -> Type #

Methods

from :: Proof -> Rep Proof x #

to :: Rep Proof x -> Proof #

Decode Proof Source # 
Instance details

Defined in Auth.Biscuit.Proto

Encode Proof Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

encode :: Proof -> Put #

type Rep Proof Source # 
Instance details

Defined in Auth.Biscuit.Proto

type Rep Proof = D1 ('MetaData "Proof" "Auth.Biscuit.Proto" "biscuit-haskell-0.2.2.0-inplace" 'False) (C1 ('MetaCons "ProofSecret" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Required 1 (Value ByteString)))) :+: C1 ('MetaCons "ProofSignature" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Required 2 (Value ByteString)))))

data Block Source #

Instances

Instances details
Show Block Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

showsPrec :: Int -> Block -> ShowS #

show :: Block -> String #

showList :: [Block] -> ShowS #

Generic Block Source # 
Instance details

Defined in Auth.Biscuit.Proto

Associated Types

type Rep Block :: Type -> Type #

Methods

from :: Block -> Rep Block x #

to :: Rep Block x -> Block #

Decode Block Source # 
Instance details

Defined in Auth.Biscuit.Proto

Encode Block Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

encode :: Block -> Put #

type Rep Block Source # 
Instance details

Defined in Auth.Biscuit.Proto

newtype FactV2 Source #

Constructors

FactV2 

Instances

Instances details
Show FactV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Generic FactV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Associated Types

type Rep FactV2 :: Type -> Type #

Methods

from :: FactV2 -> Rep FactV2 x #

to :: Rep FactV2 x -> FactV2 #

Decode FactV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Encode FactV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

encode :: FactV2 -> Put #

type Rep FactV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

type Rep FactV2 = D1 ('MetaData "FactV2" "Auth.Biscuit.Proto" "biscuit-haskell-0.2.2.0-inplace" 'True) (C1 ('MetaCons "FactV2" 'PrefixI 'True) (S1 ('MetaSel ('Just "predicate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Required 1 (Message PredicateV2)))))

data RuleV2 Source #

Instances

Instances details
Show RuleV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Generic RuleV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Associated Types

type Rep RuleV2 :: Type -> Type #

Methods

from :: RuleV2 -> Rep RuleV2 x #

to :: Rep RuleV2 x -> RuleV2 #

Decode RuleV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Encode RuleV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

encode :: RuleV2 -> Put #

type Rep RuleV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

newtype CheckV2 Source #

Constructors

CheckV2 

Instances

Instances details
Show CheckV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Generic CheckV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Associated Types

type Rep CheckV2 :: Type -> Type #

Methods

from :: CheckV2 -> Rep CheckV2 x #

to :: Rep CheckV2 x -> CheckV2 #

Decode CheckV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Encode CheckV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

encode :: CheckV2 -> Put #

type Rep CheckV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

type Rep CheckV2 = D1 ('MetaData "CheckV2" "Auth.Biscuit.Proto" "biscuit-haskell-0.2.2.0-inplace" 'True) (C1 ('MetaCons "CheckV2" 'PrefixI 'True) (S1 ('MetaSel ('Just "queries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Repeated 1 (Message RuleV2)))))

data PredicateV2 Source #

Constructors

PredicateV2 

Instances

Instances details
Show PredicateV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Generic PredicateV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Associated Types

type Rep PredicateV2 :: Type -> Type #

Decode PredicateV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Encode PredicateV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

encode :: PredicateV2 -> Put #

type Rep PredicateV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

type Rep PredicateV2 = D1 ('MetaData "PredicateV2" "Auth.Biscuit.Proto" "biscuit-haskell-0.2.2.0-inplace" 'False) (C1 ('MetaCons "PredicateV2" 'PrefixI 'True) (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Required 1 (Value Int64))) :*: S1 ('MetaSel ('Just "terms") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Repeated 2 (Message TermV2)))))

data TermV2 Source #

Instances

Instances details
Show TermV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Generic TermV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Associated Types

type Rep TermV2 :: Type -> Type #

Methods

from :: TermV2 -> Rep TermV2 x #

to :: Rep TermV2 x -> TermV2 #

Decode TermV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Encode TermV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

encode :: TermV2 -> Put #

type Rep TermV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

newtype ExpressionV2 Source #

Constructors

ExpressionV2 

Fields

Instances

Instances details
Show ExpressionV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Generic ExpressionV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Associated Types

type Rep ExpressionV2 :: Type -> Type #

Decode ExpressionV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Encode ExpressionV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

encode :: ExpressionV2 -> Put #

type Rep ExpressionV2 Source # 
Instance details

Defined in Auth.Biscuit.Proto

type Rep ExpressionV2 = D1 ('MetaData "ExpressionV2" "Auth.Biscuit.Proto" "biscuit-haskell-0.2.2.0-inplace" 'True) (C1 ('MetaCons "ExpressionV2" 'PrefixI 'True) (S1 ('MetaSel ('Just "ops") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Repeated 1 (Message Op)))))

newtype TermSet Source #

Constructors

TermSet 

Fields

Instances

Instances details
Show TermSet Source # 
Instance details

Defined in Auth.Biscuit.Proto

Generic TermSet Source # 
Instance details

Defined in Auth.Biscuit.Proto

Associated Types

type Rep TermSet :: Type -> Type #

Methods

from :: TermSet -> Rep TermSet x #

to :: Rep TermSet x -> TermSet #

Decode TermSet Source # 
Instance details

Defined in Auth.Biscuit.Proto

Encode TermSet Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

encode :: TermSet -> Put #

type Rep TermSet Source # 
Instance details

Defined in Auth.Biscuit.Proto

type Rep TermSet = D1 ('MetaData "TermSet" "Auth.Biscuit.Proto" "biscuit-haskell-0.2.2.0-inplace" 'True) (C1 ('MetaCons "TermSet" 'PrefixI 'True) (S1 ('MetaSel ('Just "set") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Repeated 1 (Message TermV2)))))

data Op Source #

Instances

Instances details
Show Op Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

showsPrec :: Int -> Op -> ShowS #

show :: Op -> String #

showList :: [Op] -> ShowS #

Generic Op Source # 
Instance details

Defined in Auth.Biscuit.Proto

Associated Types

type Rep Op :: Type -> Type #

Methods

from :: Op -> Rep Op x #

to :: Rep Op x -> Op #

Decode Op Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

decode :: HashMap Tag [WireField] -> Get Op #

Encode Op Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

encode :: Op -> Put #

type Rep Op Source # 
Instance details

Defined in Auth.Biscuit.Proto

newtype OpUnary Source #

Constructors

OpUnary 

Instances

Instances details
Show OpUnary Source # 
Instance details

Defined in Auth.Biscuit.Proto

Generic OpUnary Source # 
Instance details

Defined in Auth.Biscuit.Proto

Associated Types

type Rep OpUnary :: Type -> Type #

Methods

from :: OpUnary -> Rep OpUnary x #

to :: Rep OpUnary x -> OpUnary #

Decode OpUnary Source # 
Instance details

Defined in Auth.Biscuit.Proto

Encode OpUnary Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

encode :: OpUnary -> Put #

type Rep OpUnary Source # 
Instance details

Defined in Auth.Biscuit.Proto

type Rep OpUnary = D1 ('MetaData "OpUnary" "Auth.Biscuit.Proto" "biscuit-haskell-0.2.2.0-inplace" 'True) (C1 ('MetaCons "OpUnary" 'PrefixI 'True) (S1 ('MetaSel ('Just "kind") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Required 1 (Enumeration UnaryKind)))))

newtype OpBinary Source #

Constructors

OpBinary 

Instances

Instances details
Show OpBinary Source # 
Instance details

Defined in Auth.Biscuit.Proto

Generic OpBinary Source # 
Instance details

Defined in Auth.Biscuit.Proto

Associated Types

type Rep OpBinary :: Type -> Type #

Methods

from :: OpBinary -> Rep OpBinary x #

to :: Rep OpBinary x -> OpBinary #

Decode OpBinary Source # 
Instance details

Defined in Auth.Biscuit.Proto

Encode OpBinary Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

encode :: OpBinary -> Put #

type Rep OpBinary Source # 
Instance details

Defined in Auth.Biscuit.Proto

type Rep OpBinary = D1 ('MetaData "OpBinary" "Auth.Biscuit.Proto" "biscuit-haskell-0.2.2.0-inplace" 'True) (C1 ('MetaCons "OpBinary" 'PrefixI 'True) (S1 ('MetaSel ('Just "kind") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Required 1 (Enumeration BinaryKind)))))

newtype OpTernary Source #

Constructors

OpTernary 

Instances

Instances details
Show OpTernary Source # 
Instance details

Defined in Auth.Biscuit.Proto

Generic OpTernary Source # 
Instance details

Defined in Auth.Biscuit.Proto

Associated Types

type Rep OpTernary :: Type -> Type #

Decode OpTernary Source # 
Instance details

Defined in Auth.Biscuit.Proto

Encode OpTernary Source # 
Instance details

Defined in Auth.Biscuit.Proto

Methods

encode :: OpTernary -> Put #

type Rep OpTernary Source # 
Instance details

Defined in Auth.Biscuit.Proto

type Rep OpTernary = D1 ('MetaData "OpTernary" "Auth.Biscuit.Proto" "biscuit-haskell-0.2.2.0-inplace" 'True) (C1 ('MetaCons "OpTernary" 'PrefixI 'True) (S1 ('MetaSel ('Just "kind") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Required 1 (Enumeration TernaryKind)))))

getField :: HasField a => a -> FieldType a #

Extract a value from it's Field representation.

putField :: HasField a => FieldType a -> a #

Wrap it back up again.