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