Safe Haskell | None |
---|---|
Language | Haskell2010 |
Tax.Canada.Federal.Schedule6
Documentation
data Schedule6 (line :: Type -> Type) Source #
Constructors
Schedule6 | |
Instances
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t Page2, Foldable t Page3, Foldable t Page4, Foldable t Page5) => Foldable t Schedule6 Source # | |
(Transformation t, Functor t Page2, Functor t Page3, Functor t Page4, Functor t Page5) => Functor t Schedule6 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t Page2, Traversable t Page3, Traversable t Page4, Traversable t Page5) => Traversable t Schedule6 Source # | |
Applicative Schedule6 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Apply Schedule6 Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods (<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Schedule6 (p ~> q) -> Schedule6 p -> Schedule6 q liftA2 :: (forall a. p a -> q a -> r a) -> Schedule6 p -> Schedule6 q -> Schedule6 r liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Schedule6 p -> Schedule6 q -> Schedule6 r -> Schedule6 s | |
Distributive Schedule6 Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods collect :: forall p a (q :: Type -> Type). Functor p => (a -> Schedule6 q) -> p a -> Schedule6 (Compose p q) distribute :: forall p (q :: Type -> Type). Functor p => p (Schedule6 q) -> Schedule6 (Compose p q) cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Schedule6 p) -> Schedule6 q | |
DistributiveTraversable Schedule6 Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Schedule6 f2) -> f1 a -> Schedule6 (Compose f1 f2) distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Schedule6 f2) -> Schedule6 (Compose f1 f2) cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Schedule6 f2) -> Schedule6 f | |
Foldable Schedule6 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Functor Schedule6 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Logistic Schedule6 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Traversable Schedule6 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (Schedule6 line) Source # | |
(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (Schedule6 line) Source # | |
data Page2 (line :: Type -> Type) Source #
Constructors
Page2 | |
Fields
|
Instances
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t Questions, Foldable t PartAColumn, Foldable t PartAColumn, At t Centi) => Foldable t Page2 Source # | |
(Transformation t, Functor t Questions, Functor t PartAColumn, Functor t PartAColumn, At t Centi) => Functor t Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t Questions, Traversable t PartAColumn, Traversable t PartAColumn, At t Centi) => Traversable t Page2 Source # | |
Applicative Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Apply Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Distributive Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
DistributiveTraversable Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 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.Schedule6 | |
Functor Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Logistic Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Traversable Page2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(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 Questions (line :: Type -> Type) Source #
Constructors
Questions | |
Fields
|
Instances
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, At t Bool, At t Bool, At t Bool, At t Bool, At t Bool, At t Bool) => Foldable t Questions Source # | |
(Transformation t, At t Bool, At t Bool, At t Bool, At t Bool, At t Bool, At t Bool) => Functor t Questions Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(Transformation t, Codomain t ~ Compose m f, Applicative m, At t Bool, At t Bool, At t Bool, At t Bool, At t Bool, At t Bool) => Traversable t Questions Source # | |
Applicative Questions Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Apply Questions Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods (<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Questions (p ~> q) -> Questions p -> Questions q liftA2 :: (forall a. p a -> q a -> r a) -> Questions p -> Questions q -> Questions r liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Questions p -> Questions q -> Questions r -> Questions s | |
Distributive Questions Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods collect :: forall p a (q :: Type -> Type). Functor p => (a -> Questions q) -> p a -> Questions (Compose p q) distribute :: forall p (q :: Type -> Type). Functor p => p (Questions q) -> Questions (Compose p q) cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Questions p) -> Questions q | |
DistributiveTraversable Questions Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Questions f2) -> f1 a -> Questions (Compose f1 f2) distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Questions f2) -> Questions (Compose f1 f2) cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Questions f2) -> Questions f | |
Foldable Questions Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Functor Questions Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Logistic Questions Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Traversable Questions Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (Questions line) Source # | |
(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (Questions line) Source # | |
data PartAColumn (line :: Type -> Type) Source #
Constructors
PartAColumn | |
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) => Foldable t PartAColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(Transformation t, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi) => Functor t PartAColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods (<$>) :: t -> PartAColumn (Domain t) -> PartAColumn (Codomain t) | |
(Transformation t, Codomain t ~ Compose m f, Applicative m, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi) => Traversable t PartAColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> PartAColumn (Domain t) -> m0 (PartAColumn f0) | |
Applicative PartAColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods pure :: (forall a. f a) -> PartAColumn f | |
Apply PartAColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods (<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). PartAColumn (p ~> q) -> PartAColumn p -> PartAColumn q liftA2 :: (forall a. p a -> q a -> r a) -> PartAColumn p -> PartAColumn q -> PartAColumn r liftA3 :: (forall a. p a -> q a -> r a -> s a) -> PartAColumn p -> PartAColumn q -> PartAColumn r -> PartAColumn s | |
Distributive PartAColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods collect :: forall p a (q :: Type -> Type). Functor p => (a -> PartAColumn q) -> p a -> PartAColumn (Compose p q) distribute :: forall p (q :: Type -> Type). Functor p => p (PartAColumn q) -> PartAColumn (Compose p q) cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (PartAColumn p) -> PartAColumn q | |
DistributiveTraversable PartAColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> PartAColumn f2) -> f1 a -> PartAColumn (Compose f1 f2) distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (PartAColumn f2) -> PartAColumn (Compose f1 f2) cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (PartAColumn f2) -> PartAColumn f | |
Foldable PartAColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods foldMap :: Monoid m => (forall a. p a -> m) -> PartAColumn p -> m | |
Functor PartAColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods (<$>) :: (forall a. p a -> q a) -> PartAColumn p -> PartAColumn q | |
Logistic PartAColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods deliver :: forall p (q :: Type -> Type). Contravariant p => p (PartAColumn q -> PartAColumn q) -> PartAColumn (Compose p (q ~> q)) | |
Traversable PartAColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods traverse :: Applicative m => (forall a. p a -> m (q a)) -> PartAColumn p -> m (PartAColumn q) sequence :: forall m (p :: Type -> Type). Applicative m => PartAColumn (Compose m p) -> m (PartAColumn p) | |
(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (PartAColumn line) Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods showsPrec :: Int -> PartAColumn line -> ShowS # show :: PartAColumn line -> String # showList :: [PartAColumn line] -> ShowS # | |
(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (PartAColumn line) Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods (==) :: PartAColumn line -> PartAColumn line -> Bool # (/=) :: PartAColumn line -> PartAColumn line -> Bool # |
data Page3 (line :: Type -> Type) Source #
Constructors
Page3 | |
Fields
|
Instances
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t PartBColumn, Foldable t PartBColumn, At t Centi, At t Centi, At t Centi) => Foldable t Page3 Source # | |
(Transformation t, Functor t PartBColumn, Functor t PartBColumn, At t Centi, At t Centi, At t Centi) => Functor t Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t PartBColumn, Traversable t PartBColumn, At t Centi, At t Centi, At t Centi) => Traversable t Page3 Source # | |
Applicative Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Apply Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Distributive Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
DistributiveTraversable Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 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.Schedule6 | |
Functor Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Logistic Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Traversable Page3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(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 PartBColumn (line :: Type -> Type) Source #
Constructors
PartBColumn | |
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) => Foldable t PartBColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(Transformation t, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi) => Functor t PartBColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods (<$>) :: t -> PartBColumn (Domain t) -> PartBColumn (Codomain t) | |
(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) => Traversable t PartBColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> PartBColumn (Domain t) -> m0 (PartBColumn f0) | |
Applicative PartBColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods pure :: (forall a. f a) -> PartBColumn f | |
Apply PartBColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods (<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). PartBColumn (p ~> q) -> PartBColumn p -> PartBColumn q liftA2 :: (forall a. p a -> q a -> r a) -> PartBColumn p -> PartBColumn q -> PartBColumn r liftA3 :: (forall a. p a -> q a -> r a -> s a) -> PartBColumn p -> PartBColumn q -> PartBColumn r -> PartBColumn s | |
Distributive PartBColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods collect :: forall p a (q :: Type -> Type). Functor p => (a -> PartBColumn q) -> p a -> PartBColumn (Compose p q) distribute :: forall p (q :: Type -> Type). Functor p => p (PartBColumn q) -> PartBColumn (Compose p q) cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (PartBColumn p) -> PartBColumn q | |
DistributiveTraversable PartBColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> PartBColumn f2) -> f1 a -> PartBColumn (Compose f1 f2) distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (PartBColumn f2) -> PartBColumn (Compose f1 f2) cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (PartBColumn f2) -> PartBColumn f | |
Foldable PartBColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods foldMap :: Monoid m => (forall a. p a -> m) -> PartBColumn p -> m | |
Functor PartBColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods (<$>) :: (forall a. p a -> q a) -> PartBColumn p -> PartBColumn q | |
Logistic PartBColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods deliver :: forall p (q :: Type -> Type). Contravariant p => p (PartBColumn q -> PartBColumn q) -> PartBColumn (Compose p (q ~> q)) | |
Traversable PartBColumn Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods traverse :: Applicative m => (forall a. p a -> m (q a)) -> PartBColumn p -> m (PartBColumn q) sequence :: forall m (p :: Type -> Type). Applicative m => PartBColumn (Compose m p) -> m (PartBColumn p) | |
(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (PartBColumn line) Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods showsPrec :: Int -> PartBColumn line -> ShowS # show :: PartBColumn line -> String # showList :: [PartBColumn line] -> ShowS # | |
(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (PartBColumn line) Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods (==) :: PartBColumn line -> PartBColumn line -> Bool # (/=) :: PartBColumn line -> PartBColumn line -> Bool # |
data Page4 (line :: Type -> Type) Source #
Instances
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t Step2, Foldable t Step3) => Foldable t Page4 Source # | |
(Transformation t, Functor t Step2, Functor t Step3) => Functor t Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t Step2, Traversable t Step3) => Traversable t Page4 Source # | |
Applicative Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Apply Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Distributive Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
DistributiveTraversable Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule6 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.Schedule6 | |
Functor Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Logistic Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Traversable Page4 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(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 Step2 (line :: Type -> Type) Source #
Constructors
Step2 | |
Fields
|
Instances
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, At t Centi, At t Centi, At t Centi, At t Rational, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Rational, Foldable t SubCalculation, At t Centi) => Foldable t Step2 Source # | |
(Transformation t, At t Centi, At t Centi, At t Centi, At t Rational, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Rational, Functor t SubCalculation, At t Centi) => Functor t Step2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(Transformation t, Codomain t ~ Compose m f, Applicative m, At t Centi, At t Centi, At t Centi, At t Rational, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Rational, Traversable t SubCalculation, At t Centi) => Traversable t Step2 Source # | |
Applicative Step2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Apply Step2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Distributive Step2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
DistributiveTraversable Step2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Step2 f2) -> f1 a -> Step2 (Compose f1 f2) distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Step2 f2) -> Step2 (Compose f1 f2) cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Step2 f2) -> Step2 f | |
Foldable Step2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Functor Step2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Logistic Step2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Traversable Step2 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (Step2 line) Source # | |
(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (Step2 line) Source # | |
data Step3 (line :: Type -> Type) Source #
Constructors
Step3 | |
Fields
|
Instances
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, At t Centi, At t Centi, At t Centi, At t Rational, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Rational, Foldable t SubCalculation, At t Centi, At t Centi, At t Centi) => Foldable t Step3 Source # | |
(Transformation t, At t Centi, At t Centi, At t Centi, At t Rational, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Rational, Functor t SubCalculation, At t Centi, At t Centi, At t Centi) => Functor t Step3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(Transformation t, Codomain t ~ Compose m f, Applicative m, At t Centi, At t Centi, At t Centi, At t Rational, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Rational, Traversable t SubCalculation, At t Centi, At t Centi, At t Centi) => Traversable t Step3 Source # | |
Applicative Step3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Apply Step3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Distributive Step3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
DistributiveTraversable Step3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Step3 f2) -> f1 a -> Step3 (Compose f1 f2) distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Step3 f2) -> Step3 (Compose f1 f2) cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Step3 f2) -> Step3 f | |
Foldable Step3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Functor Step3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Logistic Step3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Traversable Step3 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (Step3 line) Source # | |
(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (Step3 line) Source # | |
data Page5 (line :: Type -> Type) Source #
Constructors
Page5 | |
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) => Foldable t Page5 Source # | |
(Transformation t, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi) => Functor t Page5 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(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) => Traversable t Page5 Source # | |
Applicative Page5 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Apply Page5 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Distributive Page5 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
DistributiveTraversable Page5 Source # | |
Defined in Tax.Canada.Federal.Schedule6 Methods collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page5 f2) -> f1 a -> Page5 (Compose f1 f2) distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page5 f2) -> Page5 (Compose f1 f2) cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page5 f2) -> Page5 f | |
Foldable Page5 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Functor Page5 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Logistic Page5 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
Traversable Page5 Source # | |
Defined in Tax.Canada.Federal.Schedule6 | |
(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (Page5 line) Source # | |
(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (Page5 line) Source # | |
fixPartAColumn :: T1 Maybe -> PartAColumn Maybe -> PartAColumn Maybe Source #
fixPartBColumn :: T1 Maybe -> PartBColumn Maybe -> PartBColumn Maybe Source #