canadian-income-tax-2022.2.1: Canadian income tax calculation
Safe HaskellSafe-Inferred
LanguageHaskell2010

Tax.Canada.ON428.Types

Documentation

data ON428 line Source #

Constructors

ON428 

Fields

Instances

Instances details
Applicative ON428 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

pure :: (forall (a :: k). f a) -> ON428 f #

Apply ON428 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<*>) :: forall (p :: k -> Type) (q :: k -> Type). ON428 (p ~> q) -> ON428 p -> ON428 q #

liftA2 :: (forall (a :: k). p a -> q a -> r a) -> ON428 p -> ON428 q -> ON428 r #

liftA3 :: (forall (a :: k). p a -> q a -> r a -> s a) -> ON428 p -> ON428 q -> ON428 r -> ON428 s #

Distributive ON428 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collect :: forall p a (q :: k1 -> Type). Functor p => (a -> ON428 q) -> p a -> ON428 (Compose p q) #

distribute :: forall p (q :: k1 -> Type). Functor p => p (ON428 q) -> ON428 (Compose p q) #

cotraverse :: Functor m => (forall (a :: k1). m (p a) -> q a) -> m (ON428 p) -> ON428 q #

DistributiveTraversable ON428 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collectTraversable :: forall f1 a (f2 :: k -> Type). Traversable f1 => (a -> ON428 f2) -> f1 a -> ON428 (Compose f1 f2) #

distributeTraversable :: forall f1 (f2 :: k -> Type). Traversable f1 => f1 (ON428 f2) -> ON428 (Compose f1 f2) #

cotraverseTraversable :: Traversable f1 => (forall (x :: k). f1 (f2 x) -> f x) -> f1 (ON428 f2) -> ON428 f #

Foldable ON428 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

foldMap :: Monoid m => (forall (a :: k). p a -> m) -> ON428 p -> m #

Functor ON428 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<$>) :: (forall (a :: k). p a -> q a) -> ON428 p -> ON428 q #

Logistic ON428 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

deliver :: forall p (q :: k1 -> Type). Contravariant p => p (ON428 q -> ON428 q) -> ON428 (Compose p (q ~> q)) #

Traversable ON428 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

traverse :: Applicative m => (forall (a :: k). p a -> m (q a)) -> ON428 p -> m (ON428 q) #

sequence :: forall m (p :: k -> Type). Applicative m => ON428 (Compose m p) -> m (ON428 p) #

(Show (line Centi), Show (line Rational), Show (line Word)) => Show (ON428 line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

showsPrec :: Int -> ON428 line -> ShowS #

show :: ON428 line -> String #

showList :: [ON428 line] -> ShowS #

(Eq (line Centi), Eq (line Rational), Eq (line Word)) => Eq (ON428 line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(==) :: ON428 line -> ON428 line -> Bool #

(/=) :: ON428 line -> ON428 line -> Bool #

data Page1 line Source #

Constructors

Page1 

Fields

Instances

Instances details
Applicative Page1 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

pure :: (forall (a :: k). f a) -> Page1 f #

Apply Page1 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<*>) :: forall (p :: k -> Type) (q :: k -> Type). Page1 (p ~> q) -> Page1 p -> Page1 q #

liftA2 :: (forall (a :: k). p a -> q a -> r a) -> Page1 p -> Page1 q -> Page1 r #

liftA3 :: (forall (a :: k). p a -> q a -> r a -> s a) -> Page1 p -> Page1 q -> Page1 r -> Page1 s #

Distributive Page1 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collect :: forall p a (q :: k1 -> Type). Functor p => (a -> Page1 q) -> p a -> Page1 (Compose p q) #

distribute :: forall p (q :: k1 -> Type). Functor p => p (Page1 q) -> Page1 (Compose p q) #

cotraverse :: Functor m => (forall (a :: k1). m (p a) -> q a) -> m (Page1 p) -> Page1 q #

DistributiveTraversable Page1 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collectTraversable :: forall f1 a (f2 :: k -> Type). Traversable f1 => (a -> Page1 f2) -> f1 a -> Page1 (Compose f1 f2) #

distributeTraversable :: forall f1 (f2 :: k -> Type). Traversable f1 => f1 (Page1 f2) -> Page1 (Compose f1 f2) #

cotraverseTraversable :: Traversable f1 => (forall (x :: k). f1 (f2 x) -> f x) -> f1 (Page1 f2) -> Page1 f #

Foldable Page1 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

foldMap :: Monoid m => (forall (a :: k). p a -> m) -> Page1 p -> m #

Functor Page1 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<$>) :: (forall (a :: k). p a -> q a) -> Page1 p -> Page1 q #

Logistic Page1 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

deliver :: forall p (q :: k1 -> Type). Contravariant p => p (Page1 q -> Page1 q) -> Page1 (Compose p (q ~> q)) #

Traversable Page1 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

traverse :: Applicative m => (forall (a :: k). p a -> m (q a)) -> Page1 p -> m (Page1 q) #

sequence :: forall m (p :: k -> Type). Applicative m => Page1 (Compose m p) -> m (Page1 p) #

(Show (line Centi), Show (line Rational), Show (line Word)) => Show (Page1 line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

showsPrec :: Int -> Page1 line -> ShowS #

show :: Page1 line -> String #

showList :: [Page1 line] -> ShowS #

(Eq (line Centi), Eq (line Rational), Eq (line Word)) => Eq (Page1 line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(==) :: Page1 line -> Page1 line -> Bool #

(/=) :: Page1 line -> Page1 line -> Bool #

data Page1PartA line Source #

Instances

Instances details
Applicative Page1PartA Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

pure :: (forall (a :: k). f a) -> Page1PartA f #

Apply Page1PartA Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<*>) :: forall (p :: k -> Type) (q :: k -> Type). Page1PartA (p ~> q) -> Page1PartA p -> Page1PartA q #

liftA2 :: (forall (a :: k). p a -> q a -> r a) -> Page1PartA p -> Page1PartA q -> Page1PartA r #

liftA3 :: (forall (a :: k). p a -> q a -> r a -> s a) -> Page1PartA p -> Page1PartA q -> Page1PartA r -> Page1PartA s #

Distributive Page1PartA Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collect :: forall p a (q :: k1 -> Type). Functor p => (a -> Page1PartA q) -> p a -> Page1PartA (Compose p q) #

distribute :: forall p (q :: k1 -> Type). Functor p => p (Page1PartA q) -> Page1PartA (Compose p q) #

cotraverse :: Functor m => (forall (a :: k1). m (p a) -> q a) -> m (Page1PartA p) -> Page1PartA q #

DistributiveTraversable Page1PartA Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collectTraversable :: forall f1 a (f2 :: k -> Type). Traversable f1 => (a -> Page1PartA f2) -> f1 a -> Page1PartA (Compose f1 f2) #

distributeTraversable :: forall f1 (f2 :: k -> Type). Traversable f1 => f1 (Page1PartA f2) -> Page1PartA (Compose f1 f2) #

cotraverseTraversable :: Traversable f1 => (forall (x :: k). f1 (f2 x) -> f x) -> f1 (Page1PartA f2) -> Page1PartA f #

Foldable Page1PartA Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

foldMap :: Monoid m => (forall (a :: k). p a -> m) -> Page1PartA p -> m #

Functor Page1PartA Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<$>) :: (forall (a :: k). p a -> q a) -> Page1PartA p -> Page1PartA q #

Logistic Page1PartA Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

deliver :: forall p (q :: k1 -> Type). Contravariant p => p (Page1PartA q -> Page1PartA q) -> Page1PartA (Compose p (q ~> q)) #

Traversable Page1PartA Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

traverse :: Applicative m => (forall (a :: k). p a -> m (q a)) -> Page1PartA p -> m (Page1PartA q) #

sequence :: forall m (p :: k -> Type). Applicative m => Page1PartA (Compose m p) -> m (Page1PartA p) #

(Show (line Centi), Show (line Rational), Show (line Word)) => Show (Page1PartA line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

showsPrec :: Int -> Page1PartA line -> ShowS #

show :: Page1PartA line -> String #

showList :: [Page1PartA line] -> ShowS #

(Eq (line Centi), Eq (line Rational), Eq (line Word)) => Eq (Page1PartA line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(==) :: Page1PartA line -> Page1PartA line -> Bool #

(/=) :: Page1PartA line -> Page1PartA line -> Bool #

data TaxIncomeBracket line Source #

Instances

Instances details
Applicative TaxIncomeBracket Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

pure :: (forall (a :: k). f a) -> TaxIncomeBracket f #

Apply TaxIncomeBracket Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<*>) :: forall (p :: k -> Type) (q :: k -> Type). TaxIncomeBracket (p ~> q) -> TaxIncomeBracket p -> TaxIncomeBracket q #

liftA2 :: (forall (a :: k). p a -> q a -> r a) -> TaxIncomeBracket p -> TaxIncomeBracket q -> TaxIncomeBracket r #

liftA3 :: (forall (a :: k). p a -> q a -> r a -> s a) -> TaxIncomeBracket p -> TaxIncomeBracket q -> TaxIncomeBracket r -> TaxIncomeBracket s #

Distributive TaxIncomeBracket Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collect :: forall p a (q :: k1 -> Type). Functor p => (a -> TaxIncomeBracket q) -> p a -> TaxIncomeBracket (Compose p q) #

distribute :: forall p (q :: k1 -> Type). Functor p => p (TaxIncomeBracket q) -> TaxIncomeBracket (Compose p q) #

cotraverse :: Functor m => (forall (a :: k1). m (p a) -> q a) -> m (TaxIncomeBracket p) -> TaxIncomeBracket q #

DistributiveTraversable TaxIncomeBracket Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collectTraversable :: forall f1 a (f2 :: k -> Type). Traversable f1 => (a -> TaxIncomeBracket f2) -> f1 a -> TaxIncomeBracket (Compose f1 f2) #

distributeTraversable :: forall f1 (f2 :: k -> Type). Traversable f1 => f1 (TaxIncomeBracket f2) -> TaxIncomeBracket (Compose f1 f2) #

cotraverseTraversable :: Traversable f1 => (forall (x :: k). f1 (f2 x) -> f x) -> f1 (TaxIncomeBracket f2) -> TaxIncomeBracket f #

Foldable TaxIncomeBracket Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

foldMap :: Monoid m => (forall (a :: k). p a -> m) -> TaxIncomeBracket p -> m #

Functor TaxIncomeBracket Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<$>) :: (forall (a :: k). p a -> q a) -> TaxIncomeBracket p -> TaxIncomeBracket q #

Logistic TaxIncomeBracket Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

deliver :: forall p (q :: k1 -> Type). Contravariant p => p (TaxIncomeBracket q -> TaxIncomeBracket q) -> TaxIncomeBracket (Compose p (q ~> q)) #

Traversable TaxIncomeBracket Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

traverse :: Applicative m => (forall (a :: k). p a -> m (q a)) -> TaxIncomeBracket p -> m (TaxIncomeBracket q) #

sequence :: forall m (p :: k -> Type). Applicative m => TaxIncomeBracket (Compose m p) -> m (TaxIncomeBracket p) #

(Show (line Centi), Show (line Rational), Show (line Word)) => Show (TaxIncomeBracket line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

(Eq (line Centi), Eq (line Rational), Eq (line Word)) => Eq (TaxIncomeBracket line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

data Page1PartB line Source #

Instances

Instances details
Applicative Page1PartB Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

pure :: (forall (a :: k). f a) -> Page1PartB f #

Apply Page1PartB Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<*>) :: forall (p :: k -> Type) (q :: k -> Type). Page1PartB (p ~> q) -> Page1PartB p -> Page1PartB q #

liftA2 :: (forall (a :: k). p a -> q a -> r a) -> Page1PartB p -> Page1PartB q -> Page1PartB r #

liftA3 :: (forall (a :: k). p a -> q a -> r a -> s a) -> Page1PartB p -> Page1PartB q -> Page1PartB r -> Page1PartB s #

Distributive Page1PartB Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collect :: forall p a (q :: k1 -> Type). Functor p => (a -> Page1PartB q) -> p a -> Page1PartB (Compose p q) #

distribute :: forall p (q :: k1 -> Type). Functor p => p (Page1PartB q) -> Page1PartB (Compose p q) #

cotraverse :: Functor m => (forall (a :: k1). m (p a) -> q a) -> m (Page1PartB p) -> Page1PartB q #

DistributiveTraversable Page1PartB Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collectTraversable :: forall f1 a (f2 :: k -> Type). Traversable f1 => (a -> Page1PartB f2) -> f1 a -> Page1PartB (Compose f1 f2) #

distributeTraversable :: forall f1 (f2 :: k -> Type). Traversable f1 => f1 (Page1PartB f2) -> Page1PartB (Compose f1 f2) #

cotraverseTraversable :: Traversable f1 => (forall (x :: k). f1 (f2 x) -> f x) -> f1 (Page1PartB f2) -> Page1PartB f #

Foldable Page1PartB Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

foldMap :: Monoid m => (forall (a :: k). p a -> m) -> Page1PartB p -> m #

Functor Page1PartB Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<$>) :: (forall (a :: k). p a -> q a) -> Page1PartB p -> Page1PartB q #

Logistic Page1PartB Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

deliver :: forall p (q :: k1 -> Type). Contravariant p => p (Page1PartB q -> Page1PartB q) -> Page1PartB (Compose p (q ~> q)) #

Traversable Page1PartB Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

traverse :: Applicative m => (forall (a :: k). p a -> m (q a)) -> Page1PartB p -> m (Page1PartB q) #

sequence :: forall m (p :: k -> Type). Applicative m => Page1PartB (Compose m p) -> m (Page1PartB p) #

(Show (line Centi), Show (line Rational), Show (line Word)) => Show (Page1PartB line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

showsPrec :: Int -> Page1PartB line -> ShowS #

show :: Page1PartB line -> String #

showList :: [Page1PartB line] -> ShowS #

(Eq (line Centi), Eq (line Rational), Eq (line Word)) => Eq (Page1PartB line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(==) :: Page1PartB line -> Page1PartB line -> Bool #

(/=) :: Page1PartB line -> Page1PartB line -> Bool #

data Page2 line Source #

Constructors

Page2 

Fields

Instances

Instances details
Applicative Page2 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

pure :: (forall (a :: k). f a) -> Page2 f #

Apply Page2 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<*>) :: forall (p :: k -> Type) (q :: k -> Type). Page2 (p ~> q) -> Page2 p -> Page2 q #

liftA2 :: (forall (a :: k). p a -> q a -> r a) -> Page2 p -> Page2 q -> Page2 r #

liftA3 :: (forall (a :: k). p a -> q a -> r a -> s a) -> Page2 p -> Page2 q -> Page2 r -> Page2 s #

Distributive Page2 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collect :: forall p a (q :: k1 -> Type). Functor p => (a -> Page2 q) -> p a -> Page2 (Compose p q) #

distribute :: forall p (q :: k1 -> Type). Functor p => p (Page2 q) -> Page2 (Compose p q) #

cotraverse :: Functor m => (forall (a :: k1). m (p a) -> q a) -> m (Page2 p) -> Page2 q #

DistributiveTraversable Page2 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collectTraversable :: forall f1 a (f2 :: k -> Type). Traversable f1 => (a -> Page2 f2) -> f1 a -> Page2 (Compose f1 f2) #

distributeTraversable :: forall f1 (f2 :: k -> Type). Traversable f1 => f1 (Page2 f2) -> Page2 (Compose f1 f2) #

cotraverseTraversable :: Traversable f1 => (forall (x :: k). f1 (f2 x) -> f x) -> f1 (Page2 f2) -> Page2 f #

Foldable Page2 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

foldMap :: Monoid m => (forall (a :: k). p a -> m) -> Page2 p -> m #

Functor Page2 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<$>) :: (forall (a :: k). p a -> q a) -> Page2 p -> Page2 q #

Logistic Page2 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

deliver :: forall p (q :: k1 -> Type). Contravariant p => p (Page2 q -> Page2 q) -> Page2 (Compose p (q ~> q)) #

Traversable Page2 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

traverse :: Applicative m => (forall (a :: k). p a -> m (q a)) -> Page2 p -> m (Page2 q) #

sequence :: forall m (p :: k -> Type). Applicative m => Page2 (Compose m p) -> m (Page2 p) #

(Show (line Centi), Show (line Rational), Show (line Word)) => Show (Page2 line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

showsPrec :: Int -> Page2 line -> ShowS #

show :: Page2 line -> String #

showList :: [Page2 line] -> ShowS #

(Eq (line Centi), Eq (line Rational), Eq (line Word)) => Eq (Page2 line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(==) :: Page2 line -> Page2 line -> Bool #

(/=) :: Page2 line -> Page2 line -> Bool #

data Page2PartB line Source #

Constructors

Page2PartB 

Fields

Instances

Instances details
Applicative Page2PartB Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

pure :: (forall (a :: k). f a) -> Page2PartB f #

Apply Page2PartB Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<*>) :: forall (p :: k -> Type) (q :: k -> Type). Page2PartB (p ~> q) -> Page2PartB p -> Page2PartB q #

liftA2 :: (forall (a :: k). p a -> q a -> r a) -> Page2PartB p -> Page2PartB q -> Page2PartB r #

liftA3 :: (forall (a :: k). p a -> q a -> r a -> s a) -> Page2PartB p -> Page2PartB q -> Page2PartB r -> Page2PartB s #

Distributive Page2PartB Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collect :: forall p a (q :: k1 -> Type). Functor p => (a -> Page2PartB q) -> p a -> Page2PartB (Compose p q) #

distribute :: forall p (q :: k1 -> Type). Functor p => p (Page2PartB q) -> Page2PartB (Compose p q) #

cotraverse :: Functor m => (forall (a :: k1). m (p a) -> q a) -> m (Page2PartB p) -> Page2PartB q #

DistributiveTraversable Page2PartB Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collectTraversable :: forall f1 a (f2 :: k -> Type). Traversable f1 => (a -> Page2PartB f2) -> f1 a -> Page2PartB (Compose f1 f2) #

distributeTraversable :: forall f1 (f2 :: k -> Type). Traversable f1 => f1 (Page2PartB f2) -> Page2PartB (Compose f1 f2) #

cotraverseTraversable :: Traversable f1 => (forall (x :: k). f1 (f2 x) -> f x) -> f1 (Page2PartB f2) -> Page2PartB f #

Foldable Page2PartB Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

foldMap :: Monoid m => (forall (a :: k). p a -> m) -> Page2PartB p -> m #

Functor Page2PartB Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<$>) :: (forall (a :: k). p a -> q a) -> Page2PartB p -> Page2PartB q #

Logistic Page2PartB Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

deliver :: forall p (q :: k1 -> Type). Contravariant p => p (Page2PartB q -> Page2PartB q) -> Page2PartB (Compose p (q ~> q)) #

Traversable Page2PartB Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

traverse :: Applicative m => (forall (a :: k). p a -> m (q a)) -> Page2PartB p -> m (Page2PartB q) #

sequence :: forall m (p :: k -> Type). Applicative m => Page2PartB (Compose m p) -> m (Page2PartB p) #

(Show (line Centi), Show (line Rational), Show (line Word)) => Show (Page2PartB line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

showsPrec :: Int -> Page2PartB line -> ShowS #

show :: Page2PartB line -> String #

showList :: [Page2PartB line] -> ShowS #

(Eq (line Centi), Eq (line Rational), Eq (line Word)) => Eq (Page2PartB line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(==) :: Page2PartB line -> Page2PartB line -> Bool #

(/=) :: Page2PartB line -> Page2PartB line -> Bool #

data MedicalExpenses line Source #

Instances

Instances details
Applicative MedicalExpenses Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

pure :: (forall (a :: k). f a) -> MedicalExpenses f #

Apply MedicalExpenses Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<*>) :: forall (p :: k -> Type) (q :: k -> Type). MedicalExpenses (p ~> q) -> MedicalExpenses p -> MedicalExpenses q #

liftA2 :: (forall (a :: k). p a -> q a -> r a) -> MedicalExpenses p -> MedicalExpenses q -> MedicalExpenses r #

liftA3 :: (forall (a :: k). p a -> q a -> r a -> s a) -> MedicalExpenses p -> MedicalExpenses q -> MedicalExpenses r -> MedicalExpenses s #

Distributive MedicalExpenses Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collect :: forall p a (q :: k1 -> Type). Functor p => (a -> MedicalExpenses q) -> p a -> MedicalExpenses (Compose p q) #

distribute :: forall p (q :: k1 -> Type). Functor p => p (MedicalExpenses q) -> MedicalExpenses (Compose p q) #

cotraverse :: Functor m => (forall (a :: k1). m (p a) -> q a) -> m (MedicalExpenses p) -> MedicalExpenses q #

DistributiveTraversable MedicalExpenses Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collectTraversable :: forall f1 a (f2 :: k -> Type). Traversable f1 => (a -> MedicalExpenses f2) -> f1 a -> MedicalExpenses (Compose f1 f2) #

distributeTraversable :: forall f1 (f2 :: k -> Type). Traversable f1 => f1 (MedicalExpenses f2) -> MedicalExpenses (Compose f1 f2) #

cotraverseTraversable :: Traversable f1 => (forall (x :: k). f1 (f2 x) -> f x) -> f1 (MedicalExpenses f2) -> MedicalExpenses f #

Foldable MedicalExpenses Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

foldMap :: Monoid m => (forall (a :: k). p a -> m) -> MedicalExpenses p -> m #

Functor MedicalExpenses Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<$>) :: (forall (a :: k). p a -> q a) -> MedicalExpenses p -> MedicalExpenses q #

Logistic MedicalExpenses Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

deliver :: forall p (q :: k1 -> Type). Contravariant p => p (MedicalExpenses q -> MedicalExpenses q) -> MedicalExpenses (Compose p (q ~> q)) #

Traversable MedicalExpenses Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

traverse :: Applicative m => (forall (a :: k). p a -> m (q a)) -> MedicalExpenses p -> m (MedicalExpenses q) #

sequence :: forall m (p :: k -> Type). Applicative m => MedicalExpenses (Compose m p) -> m (MedicalExpenses p) #

(Show (line Centi), Show (line Rational), Show (line Word)) => Show (MedicalExpenses line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

(Eq (line Centi), Eq (line Rational), Eq (line Word)) => Eq (MedicalExpenses line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(==) :: MedicalExpenses line -> MedicalExpenses line -> Bool #

(/=) :: MedicalExpenses line -> MedicalExpenses line -> Bool #

data Donations line Source #

Constructors

Donations 

Fields

Instances

Instances details
Applicative Donations Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

pure :: (forall (a :: k). f a) -> Donations f #

Apply Donations Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<*>) :: forall (p :: k -> Type) (q :: k -> Type). Donations (p ~> q) -> Donations p -> Donations q #

liftA2 :: (forall (a :: k). p a -> q a -> r a) -> Donations p -> Donations q -> Donations r #

liftA3 :: (forall (a :: k). p a -> q a -> r a -> s a) -> Donations p -> Donations q -> Donations r -> Donations s #

Distributive Donations Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collect :: forall p a (q :: k1 -> Type). Functor p => (a -> Donations q) -> p a -> Donations (Compose p q) #

distribute :: forall p (q :: k1 -> Type). Functor p => p (Donations q) -> Donations (Compose p q) #

cotraverse :: Functor m => (forall (a :: k1). m (p a) -> q a) -> m (Donations p) -> Donations q #

DistributiveTraversable Donations Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collectTraversable :: forall f1 a (f2 :: k -> Type). Traversable f1 => (a -> Donations f2) -> f1 a -> Donations (Compose f1 f2) #

distributeTraversable :: forall f1 (f2 :: k -> Type). Traversable f1 => f1 (Donations f2) -> Donations (Compose f1 f2) #

cotraverseTraversable :: Traversable f1 => (forall (x :: k). f1 (f2 x) -> f x) -> f1 (Donations f2) -> Donations f #

Foldable Donations Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

foldMap :: Monoid m => (forall (a :: k). p a -> m) -> Donations p -> m #

Functor Donations Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<$>) :: (forall (a :: k). p a -> q a) -> Donations p -> Donations q #

Logistic Donations Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

deliver :: forall p (q :: k1 -> Type). Contravariant p => p (Donations q -> Donations q) -> Donations (Compose p (q ~> q)) #

Traversable Donations Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

traverse :: Applicative m => (forall (a :: k). p a -> m (q a)) -> Donations p -> m (Donations q) #

sequence :: forall m (p :: k -> Type). Applicative m => Donations (Compose m p) -> m (Donations p) #

(Show (line Centi), Show (line Rational), Show (line Word)) => Show (Donations line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

showsPrec :: Int -> Donations line -> ShowS #

show :: Donations line -> String #

showList :: [Donations line] -> ShowS #

(Eq (line Centi), Eq (line Rational), Eq (line Word)) => Eq (Donations line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(==) :: Donations line -> Donations line -> Bool #

(/=) :: Donations line -> Donations line -> Bool #

data Page2PartC line Source #

Constructors

Page2PartC 

Fields

Instances

Instances details
Applicative Page2PartC Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

pure :: (forall (a :: k). f a) -> Page2PartC f #

Apply Page2PartC Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<*>) :: forall (p :: k -> Type) (q :: k -> Type). Page2PartC (p ~> q) -> Page2PartC p -> Page2PartC q #

liftA2 :: (forall (a :: k). p a -> q a -> r a) -> Page2PartC p -> Page2PartC q -> Page2PartC r #

liftA3 :: (forall (a :: k). p a -> q a -> r a -> s a) -> Page2PartC p -> Page2PartC q -> Page2PartC r -> Page2PartC s #

Distributive Page2PartC Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collect :: forall p a (q :: k1 -> Type). Functor p => (a -> Page2PartC q) -> p a -> Page2PartC (Compose p q) #

distribute :: forall p (q :: k1 -> Type). Functor p => p (Page2PartC q) -> Page2PartC (Compose p q) #

cotraverse :: Functor m => (forall (a :: k1). m (p a) -> q a) -> m (Page2PartC p) -> Page2PartC q #

DistributiveTraversable Page2PartC Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collectTraversable :: forall f1 a (f2 :: k -> Type). Traversable f1 => (a -> Page2PartC f2) -> f1 a -> Page2PartC (Compose f1 f2) #

distributeTraversable :: forall f1 (f2 :: k -> Type). Traversable f1 => f1 (Page2PartC f2) -> Page2PartC (Compose f1 f2) #

cotraverseTraversable :: Traversable f1 => (forall (x :: k). f1 (f2 x) -> f x) -> f1 (Page2PartC f2) -> Page2PartC f #

Foldable Page2PartC Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

foldMap :: Monoid m => (forall (a :: k). p a -> m) -> Page2PartC p -> m #

Functor Page2PartC Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<$>) :: (forall (a :: k). p a -> q a) -> Page2PartC p -> Page2PartC q #

Logistic Page2PartC Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

deliver :: forall p (q :: k1 -> Type). Contravariant p => p (Page2PartC q -> Page2PartC q) -> Page2PartC (Compose p (q ~> q)) #

Traversable Page2PartC Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

traverse :: Applicative m => (forall (a :: k). p a -> m (q a)) -> Page2PartC p -> m (Page2PartC q) #

sequence :: forall m (p :: k -> Type). Applicative m => Page2PartC (Compose m p) -> m (Page2PartC p) #

(Show (line Centi), Show (line Rational), Show (line Word)) => Show (Page2PartC line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

showsPrec :: Int -> Page2PartC line -> ShowS #

show :: Page2PartC line -> String #

showList :: [Page2PartC line] -> ShowS #

(Eq (line Centi), Eq (line Rational), Eq (line Word)) => Eq (Page2PartC line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(==) :: Page2PartC line -> Page2PartC line -> Bool #

(/=) :: Page2PartC line -> Page2PartC line -> Bool #

data Page3 line Source #

Constructors

Page3 

Fields

Instances

Instances details
Applicative Page3 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

pure :: (forall (a :: k). f a) -> Page3 f #

Apply Page3 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<*>) :: forall (p :: k -> Type) (q :: k -> Type). Page3 (p ~> q) -> Page3 p -> Page3 q #

liftA2 :: (forall (a :: k). p a -> q a -> r a) -> Page3 p -> Page3 q -> Page3 r #

liftA3 :: (forall (a :: k). p a -> q a -> r a -> s a) -> Page3 p -> Page3 q -> Page3 r -> Page3 s #

Distributive Page3 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collect :: forall p a (q :: k1 -> Type). Functor p => (a -> Page3 q) -> p a -> Page3 (Compose p q) #

distribute :: forall p (q :: k1 -> Type). Functor p => p (Page3 q) -> Page3 (Compose p q) #

cotraverse :: Functor m => (forall (a :: k1). m (p a) -> q a) -> m (Page3 p) -> Page3 q #

DistributiveTraversable Page3 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collectTraversable :: forall f1 a (f2 :: k -> Type). Traversable f1 => (a -> Page3 f2) -> f1 a -> Page3 (Compose f1 f2) #

distributeTraversable :: forall f1 (f2 :: k -> Type). Traversable f1 => f1 (Page3 f2) -> Page3 (Compose f1 f2) #

cotraverseTraversable :: Traversable f1 => (forall (x :: k). f1 (f2 x) -> f x) -> f1 (Page3 f2) -> Page3 f #

Foldable Page3 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

foldMap :: Monoid m => (forall (a :: k). p a -> m) -> Page3 p -> m #

Functor Page3 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<$>) :: (forall (a :: k). p a -> q a) -> Page3 p -> Page3 q #

Logistic Page3 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

deliver :: forall p (q :: k1 -> Type). Contravariant p => p (Page3 q -> Page3 q) -> Page3 (Compose p (q ~> q)) #

Traversable Page3 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

traverse :: Applicative m => (forall (a :: k). p a -> m (q a)) -> Page3 p -> m (Page3 q) #

sequence :: forall m (p :: k -> Type). Applicative m => Page3 (Compose m p) -> m (Page3 p) #

(Show (line Centi), Show (line Rational), Show (line Word)) => Show (Page3 line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

showsPrec :: Int -> Page3 line -> ShowS #

show :: Page3 line -> String #

showList :: [Page3 line] -> ShowS #

(Eq (line Centi), Eq (line Rational), Eq (line Word)) => Eq (Page3 line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(==) :: Page3 line -> Page3 line -> Bool #

(/=) :: Page3 line -> Page3 line -> Bool #

data Page4 line Source #

Constructors

Page4 

Fields

Instances

Instances details
Applicative Page4 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

pure :: (forall (a :: k). f a) -> Page4 f #

Apply Page4 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<*>) :: forall (p :: k -> Type) (q :: k -> Type). Page4 (p ~> q) -> Page4 p -> Page4 q #

liftA2 :: (forall (a :: k). p a -> q a -> r a) -> Page4 p -> Page4 q -> Page4 r #

liftA3 :: (forall (a :: k). p a -> q a -> r a -> s a) -> Page4 p -> Page4 q -> Page4 r -> Page4 s #

Distributive Page4 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collect :: forall p a (q :: k1 -> Type). Functor p => (a -> Page4 q) -> p a -> Page4 (Compose p q) #

distribute :: forall p (q :: k1 -> Type). Functor p => p (Page4 q) -> Page4 (Compose p q) #

cotraverse :: Functor m => (forall (a :: k1). m (p a) -> q a) -> m (Page4 p) -> Page4 q #

DistributiveTraversable Page4 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collectTraversable :: forall f1 a (f2 :: k -> Type). Traversable f1 => (a -> Page4 f2) -> f1 a -> Page4 (Compose f1 f2) #

distributeTraversable :: forall f1 (f2 :: k -> Type). Traversable f1 => f1 (Page4 f2) -> Page4 (Compose f1 f2) #

cotraverseTraversable :: Traversable f1 => (forall (x :: k). f1 (f2 x) -> f x) -> f1 (Page4 f2) -> Page4 f #

Foldable Page4 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

foldMap :: Monoid m => (forall (a :: k). p a -> m) -> Page4 p -> m #

Functor Page4 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<$>) :: (forall (a :: k). p a -> q a) -> Page4 p -> Page4 q #

Logistic Page4 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

deliver :: forall p (q :: k1 -> Type). Contravariant p => p (Page4 q -> Page4 q) -> Page4 (Compose p (q ~> q)) #

Traversable Page4 Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

traverse :: Applicative m => (forall (a :: k). p a -> m (q a)) -> Page4 p -> m (Page4 q) #

sequence :: forall m (p :: k -> Type). Applicative m => Page4 (Compose m p) -> m (Page4 p) #

(Show (line Centi), Show (line Rational), Show (line Word)) => Show (Page4 line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

showsPrec :: Int -> Page4 line -> ShowS #

show :: Page4 line -> String #

showList :: [Page4 line] -> ShowS #

(Eq (line Centi), Eq (line Rational), Eq (line Word)) => Eq (Page4 line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(==) :: Page4 line -> Page4 line -> Bool #

(/=) :: Page4 line -> Page4 line -> Bool #

data HealthPremium line Source #

Instances

Instances details
Applicative HealthPremium Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

pure :: (forall (a :: k). f a) -> HealthPremium f #

Apply HealthPremium Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<*>) :: forall (p :: k -> Type) (q :: k -> Type). HealthPremium (p ~> q) -> HealthPremium p -> HealthPremium q #

liftA2 :: (forall (a :: k). p a -> q a -> r a) -> HealthPremium p -> HealthPremium q -> HealthPremium r #

liftA3 :: (forall (a :: k). p a -> q a -> r a -> s a) -> HealthPremium p -> HealthPremium q -> HealthPremium r -> HealthPremium s #

Distributive HealthPremium Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collect :: forall p a (q :: k1 -> Type). Functor p => (a -> HealthPremium q) -> p a -> HealthPremium (Compose p q) #

distribute :: forall p (q :: k1 -> Type). Functor p => p (HealthPremium q) -> HealthPremium (Compose p q) #

cotraverse :: Functor m => (forall (a :: k1). m (p a) -> q a) -> m (HealthPremium p) -> HealthPremium q #

DistributiveTraversable HealthPremium Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collectTraversable :: forall f1 a (f2 :: k -> Type). Traversable f1 => (a -> HealthPremium f2) -> f1 a -> HealthPremium (Compose f1 f2) #

distributeTraversable :: forall f1 (f2 :: k -> Type). Traversable f1 => f1 (HealthPremium f2) -> HealthPremium (Compose f1 f2) #

cotraverseTraversable :: Traversable f1 => (forall (x :: k). f1 (f2 x) -> f x) -> f1 (HealthPremium f2) -> HealthPremium f #

Foldable HealthPremium Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

foldMap :: Monoid m => (forall (a :: k). p a -> m) -> HealthPremium p -> m #

Functor HealthPremium Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<$>) :: (forall (a :: k). p a -> q a) -> HealthPremium p -> HealthPremium q #

Logistic HealthPremium Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

deliver :: forall p (q :: k1 -> Type). Contravariant p => p (HealthPremium q -> HealthPremium q) -> HealthPremium (Compose p (q ~> q)) #

Traversable HealthPremium Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

traverse :: Applicative m => (forall (a :: k). p a -> m (q a)) -> HealthPremium p -> m (HealthPremium q) #

sequence :: forall m (p :: k -> Type). Applicative m => HealthPremium (Compose m p) -> m (HealthPremium p) #

(Show (line Centi), Show (line Rational), Show (line Word)) => Show (HealthPremium line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

showsPrec :: Int -> HealthPremium line -> ShowS #

show :: HealthPremium line -> String #

showList :: [HealthPremium line] -> ShowS #

(Eq (line Centi), Eq (line Rational), Eq (line Word)) => Eq (HealthPremium line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(==) :: HealthPremium line -> HealthPremium line -> Bool #

(/=) :: HealthPremium line -> HealthPremium line -> Bool #

data HealthPremiumBracket line Source #

Constructors

HealthPremiumBracket 

Fields

Instances

Instances details
Applicative HealthPremiumBracket Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

pure :: (forall (a :: k). f a) -> HealthPremiumBracket f #

Apply HealthPremiumBracket Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<*>) :: forall (p :: k -> Type) (q :: k -> Type). HealthPremiumBracket (p ~> q) -> HealthPremiumBracket p -> HealthPremiumBracket q #

liftA2 :: (forall (a :: k). p a -> q a -> r a) -> HealthPremiumBracket p -> HealthPremiumBracket q -> HealthPremiumBracket r #

liftA3 :: (forall (a :: k). p a -> q a -> r a -> s a) -> HealthPremiumBracket p -> HealthPremiumBracket q -> HealthPremiumBracket r -> HealthPremiumBracket s #

Distributive HealthPremiumBracket Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collect :: forall p a (q :: k1 -> Type). Functor p => (a -> HealthPremiumBracket q) -> p a -> HealthPremiumBracket (Compose p q) #

distribute :: forall p (q :: k1 -> Type). Functor p => p (HealthPremiumBracket q) -> HealthPremiumBracket (Compose p q) #

cotraverse :: Functor m => (forall (a :: k1). m (p a) -> q a) -> m (HealthPremiumBracket p) -> HealthPremiumBracket q #

DistributiveTraversable HealthPremiumBracket Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

collectTraversable :: forall f1 a (f2 :: k -> Type). Traversable f1 => (a -> HealthPremiumBracket f2) -> f1 a -> HealthPremiumBracket (Compose f1 f2) #

distributeTraversable :: forall f1 (f2 :: k -> Type). Traversable f1 => f1 (HealthPremiumBracket f2) -> HealthPremiumBracket (Compose f1 f2) #

cotraverseTraversable :: Traversable f1 => (forall (x :: k). f1 (f2 x) -> f x) -> f1 (HealthPremiumBracket f2) -> HealthPremiumBracket f #

Foldable HealthPremiumBracket Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

foldMap :: Monoid m => (forall (a :: k). p a -> m) -> HealthPremiumBracket p -> m #

Functor HealthPremiumBracket Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

(<$>) :: (forall (a :: k). p a -> q a) -> HealthPremiumBracket p -> HealthPremiumBracket q #

Logistic HealthPremiumBracket Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

deliver :: forall p (q :: k1 -> Type). Contravariant p => p (HealthPremiumBracket q -> HealthPremiumBracket q) -> HealthPremiumBracket (Compose p (q ~> q)) #

Traversable HealthPremiumBracket Source # 
Instance details

Defined in Tax.Canada.ON428.Types

Methods

traverse :: Applicative m => (forall (a :: k). p a -> m (q a)) -> HealthPremiumBracket p -> m (HealthPremiumBracket q) #

sequence :: forall m (p :: k -> Type). Applicative m => HealthPremiumBracket (Compose m p) -> m (HealthPremiumBracket p) #

(Show (line Centi), Show (line Rational), Show (line Word)) => Show (HealthPremiumBracket line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types

(Eq (line Centi), Eq (line Rational), Eq (line Word)) => Eq (HealthPremiumBracket line) Source # 
Instance details

Defined in Tax.Canada.ON428.Types