Safe Haskell | None |
---|---|
Language | Haskell2010 |
Tax.Canada.Federal.Schedule7
Documentation
data Schedule7 (line :: Type -> Type) Source #
Instances
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t Page2, Foldable t Page3, Foldable t Page4) => Foldable t Schedule7 Source # | |
(Transformation t, Functor t Page2, Functor t Page3, Functor t Page4) => Functor t Schedule7 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t Page2, Traversable t Page3, Traversable t Page4) => Traversable t Schedule7 Source # | |
Applicative Schedule7 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Apply Schedule7 Source # | |
Defined in Tax.Canada.Federal.Schedule7 Methods (<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Schedule7 (p ~> q) -> Schedule7 p -> Schedule7 q liftA2 :: (forall a. p a -> q a -> r a) -> Schedule7 p -> Schedule7 q -> Schedule7 r liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Schedule7 p -> Schedule7 q -> Schedule7 r -> Schedule7 s | |
Distributive Schedule7 Source # | |
Defined in Tax.Canada.Federal.Schedule7 Methods collect :: forall p a (q :: Type -> Type). Functor p => (a -> Schedule7 q) -> p a -> Schedule7 (Compose p q) distribute :: forall p (q :: Type -> Type). Functor p => p (Schedule7 q) -> Schedule7 (Compose p q) cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Schedule7 p) -> Schedule7 q | |
DistributiveTraversable Schedule7 Source # | |
Defined in Tax.Canada.Federal.Schedule7 Methods collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Schedule7 f2) -> f1 a -> Schedule7 (Compose f1 f2) distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Schedule7 f2) -> Schedule7 (Compose f1 f2) cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Schedule7 f2) -> Schedule7 f | |
Foldable Schedule7 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Functor Schedule7 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Logistic Schedule7 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Traversable Schedule7 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (Schedule7 line) Source # | |
(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (Schedule7 line) Source # | |
data Page2 (line :: Type -> Type) Source #
Constructors
Page2 | |
Fields
|
Instances
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, At t Centi, At t Centi, At t Centi, Foldable t SubCalculation, At t Centi) => Foldable t Page2 Source # | |
(Transformation t, At t Centi, At t Centi, At t Centi, Functor t SubCalculation, At t Centi) => Functor t Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
(Transformation t, Codomain t ~ Compose m f, Applicative m, At t Centi, At t Centi, At t Centi, Traversable t SubCalculation, At t Centi) => Traversable t Page2 Source # | |
Applicative Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Apply Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Distributive Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
DistributiveTraversable Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule7 Methods collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page2 f2) -> f1 a -> Page2 (Compose f1 f2) distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page2 f2) -> Page2 (Compose f1 f2) cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page2 f2) -> Page2 f | |
Foldable Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Functor Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Logistic Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Traversable Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (Page2 line) Source # | |
(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (Page2 line) Source # | |
data Page3 (line :: Type -> Type) Source #
Instances
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t PartB, Foldable t PartC) => Foldable t Page3 Source # | |
(Transformation t, Functor t PartB, Functor t PartC) => Functor t Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t PartB, Traversable t PartC) => Traversable t Page3 Source # | |
Applicative Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Apply Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Distributive Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
DistributiveTraversable Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule7 Methods collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page3 f2) -> f1 a -> Page3 (Compose f1 f2) distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page3 f2) -> Page3 (Compose f1 f2) cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page3 f2) -> Page3 f | |
Foldable Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Functor Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Logistic Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Traversable Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (Page3 line) Source # | |
(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (Page3 line) Source # | |
data PartB (line :: Type -> Type) Source #
Constructors
PartB | |
Fields
|
Instances
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, At t Centi, At t Centi, At t Centi, Foldable t SubCalculation, At t Centi) => Foldable t PartB Source # | |
(Transformation t, At t Centi, At t Centi, At t Centi, Functor t SubCalculation, At t Centi) => Functor t PartB Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
(Transformation t, Codomain t ~ Compose m f, Applicative m, At t Centi, At t Centi, At t Centi, Traversable t SubCalculation, At t Centi) => Traversable t PartB Source # | |
Applicative PartB Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Apply PartB Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Distributive PartB Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
DistributiveTraversable PartB Source # | |
Defined in Tax.Canada.Federal.Schedule7 Methods collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> PartB f2) -> f1 a -> PartB (Compose f1 f2) distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (PartB f2) -> PartB (Compose f1 f2) cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (PartB f2) -> PartB f | |
Foldable PartB Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Functor PartB Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Logistic PartB Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Traversable PartB Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (PartB line) Source # | |
(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (PartB line) Source # | |
data PartC (line :: Type -> Type) Source #
Constructors
PartC | |
Fields
|
Instances
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi) => Foldable t PartC Source # | |
(Transformation t, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi) => Functor t PartC Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
(Transformation t, Codomain t ~ Compose m f, Applicative m, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi) => Traversable t PartC Source # | |
Applicative PartC Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Apply PartC Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Distributive PartC Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
DistributiveTraversable PartC Source # | |
Defined in Tax.Canada.Federal.Schedule7 Methods collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> PartC f2) -> f1 a -> PartC (Compose f1 f2) distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (PartC f2) -> PartC (Compose f1 f2) cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (PartC f2) -> PartC f | |
Foldable PartC Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Functor PartC Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Logistic PartC Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Traversable PartC Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (PartC line) Source # | |
(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (PartC line) Source # | |
data Page4 (line :: Type -> Type) Source #
Constructors
Page4 | |
Instances
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t PartD, Foldable t PartE, At t Centi) => Foldable t Page4 Source # | |
(Transformation t, Functor t PartD, Functor t PartE, At t Centi) => Functor t Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t PartD, Traversable t PartE, At t Centi) => Traversable t Page4 Source # | |
Applicative Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Apply Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Distributive Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
DistributiveTraversable Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule7 Methods collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page4 f2) -> f1 a -> Page4 (Compose f1 f2) distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page4 f2) -> Page4 (Compose f1 f2) cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page4 f2) -> Page4 f | |
Foldable Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Functor Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Logistic Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Traversable Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (Page4 line) Source # | |
(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (Page4 line) Source # | |
data PartD (line :: Type -> Type) Source #
Constructors
PartD | |
Fields
|
Instances
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, At t Centi, At t Centi, At t Centi) => Foldable t PartD Source # | |
(Transformation t, At t Centi, At t Centi, At t Centi) => Functor t PartD Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
(Transformation t, Codomain t ~ Compose m f, Applicative m, At t Centi, At t Centi, At t Centi) => Traversable t PartD Source # | |
Applicative PartD Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Apply PartD Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Distributive PartD Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
DistributiveTraversable PartD Source # | |
Defined in Tax.Canada.Federal.Schedule7 Methods collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> PartD f2) -> f1 a -> PartD (Compose f1 f2) distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (PartD f2) -> PartD (Compose f1 f2) cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (PartD f2) -> PartD f | |
Foldable PartD Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Functor PartD Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Logistic PartD Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Traversable PartD Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (PartD line) Source # | |
(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (PartD line) Source # | |
data PartE (line :: Type -> Type) Source #
Constructors
PartE | |
Fields
|
Instances
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, At t Centi, At t Bool, At t Centi, At t Bool) => Foldable t PartE Source # | |
(Transformation t, At t Centi, At t Bool, At t Centi, At t Bool) => Functor t PartE Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
(Transformation t, Codomain t ~ Compose m f, Applicative m, At t Centi, At t Bool, At t Centi, At t Bool) => Traversable t PartE Source # | |
Applicative PartE Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Apply PartE Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Distributive PartE Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
DistributiveTraversable PartE Source # | |
Defined in Tax.Canada.Federal.Schedule7 Methods collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> PartE f2) -> f1 a -> PartE (Compose f1 f2) distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (PartE f2) -> PartE (Compose f1 f2) cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (PartE f2) -> PartE f | |
Foldable PartE Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Functor PartE Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Logistic PartE Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
Traversable PartE Source # | |
Defined in Tax.Canada.Federal.Schedule7 | |
(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (PartE line) Source # | |
(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (PartE line) Source # | |