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

Tax.Canada.Province.ON

Documentation

data Returns line Source #

Constructors

Returns 

Fields

Instances

Instances details
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t Forms, Foldable t ON428, Foldable t ON479) => Foldable t Returns Source # 
Instance details

Defined in Tax.Canada.Province.ON

Methods

foldMap :: (Codomain t ~ Const m, Monoid m) => t -> Returns (Domain t) -> m #

(Transformation t, Functor t Forms, Functor t ON428, Functor t ON479) => Functor t Returns Source # 
Instance details

Defined in Tax.Canada.Province.ON

Methods

(<$>) :: t -> Returns (Domain t) -> Returns (Codomain t) #

(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t Forms, Traversable t ON428, Traversable t ON479) => Traversable t Returns Source # 
Instance details

Defined in Tax.Canada.Province.ON

Methods

traverse :: forall m (f :: Type -> Type). Codomain t ~ Compose m f => t -> Returns (Domain t) -> m (Returns f) #

Applicative Returns Source # 
Instance details

Defined in Tax.Canada.Province.ON

Methods

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

Apply Returns Source # 
Instance details

Defined in Tax.Canada.Province.ON

Methods

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

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

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

Distributive Returns Source # 
Instance details

Defined in Tax.Canada.Province.ON

Methods

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

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

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

DistributiveTraversable Returns Source # 
Instance details

Defined in Tax.Canada.Province.ON

Methods

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

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

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

Foldable Returns Source # 
Instance details

Defined in Tax.Canada.Province.ON

Methods

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

Functor Returns Source # 
Instance details

Defined in Tax.Canada.Province.ON

Methods

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

Logistic Returns Source # 
Instance details

Defined in Tax.Canada.Province.ON

Methods

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

Traversable Returns Source # 
Instance details

Defined in Tax.Canada.Province.ON

Methods

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

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

(Show (Forms line), Show (ON428 line), Show (ON479 line)) => Show (Returns line) Source # 
Instance details

Defined in Tax.Canada.Province.ON

Methods

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

show :: Returns line -> String #

showList :: [Returns line] -> ShowS #

(Eq (Forms line), Eq (ON428 line), Eq (ON479 line)) => Eq (Returns line) Source # 
Instance details

Defined in Tax.Canada.Province.ON

Methods

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

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

data ON428 line Source #

Instances

Instances details
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t Page1, Foldable t Page2, Foldable t Page3, Foldable t Page4) => Foldable t ON428 Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON428.Types

Methods

foldMap :: (Codomain t ~ Const m, Monoid m) => t -> ON428 (Domain t) -> m #

(Transformation t, Functor t Page1, Functor t Page2, Functor t Page3, Functor t Page4) => Functor t ON428 Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON428.Types

Methods

(<$>) :: t -> ON428 (Domain t) -> ON428 (Codomain t) #

(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t Page1, Traversable t Page2, Traversable t Page3, Traversable t Page4) => Traversable t ON428 Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON428.Types

Methods

traverse :: forall m (f :: Type -> Type). Codomain t ~ Compose m f => t -> ON428 (Domain t) -> m (ON428 f) #

Applicative ON428 Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON428.Types

Methods

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

Apply ON428 Source # 
Instance details

Defined in Tax.Canada.Province.ON.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.Province.ON.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.Province.ON.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.Province.ON.ON428.Types

Methods

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

Functor ON428 Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON428.Types

Methods

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

Logistic ON428 Source # 
Instance details

Defined in Tax.Canada.Province.ON.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.Province.ON.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.Province.ON.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.Province.ON.ON428.Types

Methods

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

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

data ON479 line Source #

Instances

Instances details
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t Page1, Foldable t Page2) => Foldable t ON479 Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON479.Types

Methods

foldMap :: (Codomain t ~ Const m, Monoid m) => t -> ON479 (Domain t) -> m #

(Transformation t, Functor t Page1, Functor t Page2) => Functor t ON479 Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON479.Types

Methods

(<$>) :: t -> ON479 (Domain t) -> ON479 (Codomain t) #

(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t Page1, Traversable t Page2) => Traversable t ON479 Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON479.Types

Methods

traverse :: forall m (f :: Type -> Type). Codomain t ~ Compose m f => t -> ON479 (Domain t) -> m (ON479 f) #

Applicative ON479 Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON479.Types

Methods

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

Apply ON479 Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON479.Types

Methods

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

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

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

Distributive ON479 Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON479.Types

Methods

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

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

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

DistributiveTraversable ON479 Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON479.Types

Methods

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

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

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

Foldable ON479 Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON479.Types

Methods

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

Functor ON479 Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON479.Types

Methods

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

Logistic ON479 Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON479.Types

Methods

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

Traversable ON479 Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON479.Types

Methods

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

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

(Show (line Bool), Show (line Centi), Show (line Rational), Show (line Text), Show (line Word)) => Show (ON479 line) Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON479.Types

Methods

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

show :: ON479 line -> String #

showList :: [ON479 line] -> ShowS #

(Eq (line Bool), Eq (line Centi), Eq (line Rational), Eq (line Text), Eq (line Word)) => Eq (ON479 line) Source # 
Instance details

Defined in Tax.Canada.Province.ON.ON479.Types

Methods

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

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