lol-0.7.0.0: A library for lattice cryptography.
Crypto.Proto.Lol.LinearRq
data LinearRq Source #
Constructors
Fields
Defined in Crypto.Proto.Lol.LinearRq
Methods
(==) :: LinearRq -> LinearRq -> Bool #
(/=) :: LinearRq -> LinearRq -> Bool #
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LinearRq -> c LinearRq #
gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LinearRq #
toConstr :: LinearRq -> Constr #
dataTypeOf :: LinearRq -> DataType #
dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LinearRq) #
dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LinearRq) #
gmapT :: (forall b. Data b => b -> b) -> LinearRq -> LinearRq #
gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LinearRq -> r #
gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LinearRq -> r #
gmapQ :: (forall d. Data d => d -> u) -> LinearRq -> [u] #
gmapQi :: Int -> (forall d. Data d => d -> u) -> LinearRq -> u #
gmapM :: Monad m => (forall d. Data d => d -> m d) -> LinearRq -> m LinearRq #
gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LinearRq -> m LinearRq #
gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LinearRq -> m LinearRq #
compare :: LinearRq -> LinearRq -> Ordering #
(<) :: LinearRq -> LinearRq -> Bool #
(<=) :: LinearRq -> LinearRq -> Bool #
(>) :: LinearRq -> LinearRq -> Bool #
(>=) :: LinearRq -> LinearRq -> Bool #
max :: LinearRq -> LinearRq -> LinearRq #
min :: LinearRq -> LinearRq -> LinearRq #
showsPrec :: Int -> LinearRq -> ShowS #
show :: LinearRq -> String #
showList :: [LinearRq] -> ShowS #
Associated Types
type Rep LinearRq :: Type -> Type #
from :: LinearRq -> Rep LinearRq x #
to :: Rep LinearRq x -> LinearRq #
wireSize :: FieldType -> LinearRq -> WireSize #
wirePut :: FieldType -> LinearRq -> Put #
wirePutWithSize :: FieldType -> LinearRq -> PutM WireSize #
wireGet :: FieldType -> Get LinearRq #
wireGetPacked :: FieldType -> Get (Seq LinearRq) #
textPut :: LinearRq -> Output #
textGet :: Stream s Identity Char => Parsec s () LinearRq #
tellT :: String -> LinearRq -> Output #
getT :: Stream s Identity Char => String -> Parsec s () LinearRq #
getMessageInfo :: LinearRq -> GetMessageInfo #
reflectDescriptorInfo :: LinearRq -> DescriptorInfo #
mergeAppend :: LinearRq -> LinearRq -> LinearRq #
mergeConcat :: Foldable t => t LinearRq -> LinearRq #
defaultValue :: LinearRq #
getVal :: msg' -> (msg' -> LinearRq) -> LinearRq #
isSet :: msg' -> (msg' -> LinearRq) -> Bool #