module Data.Proxy.Mapping
(
proxyHead
, proxyTail
, proxyApply
, proxySucc
, proxyPred
, proxy0of1
, proxy1of1
, proxy0of2
, proxy1of2
, proxy2of2
, proxy0of3
, proxy1of3
, proxy2of3
, proxy3of3
, proxy0of4
, proxy1of4
, proxy2of4
, proxy3of4
, proxy4of4
, proxy0of5
, proxy1of5
, proxy2of5
, proxy3of5
, proxy4of5
, proxy5of5
, proxy0of6
, proxy1of6
, proxy2of6
, proxy3of6
, proxy4of6
, proxy5of6
, proxy6of6
, proxy0of7
, proxy1of7
, proxy2of7
, proxy3of7
, proxy4of7
, proxy5of7
, proxy6of7
, proxy7of7
, proxy0of8
, proxy1of8
, proxy2of8
, proxy3of8
, proxy4of8
, proxy5of8
, proxy6of8
, proxy7of8
, proxy8of8
, proxy0of9
, proxy1of9
, proxy2of9
, proxy3of9
, proxy4of9
, proxy5of9
, proxy6of9
, proxy7of9
, proxy8of9
, proxy9of9
, proxy0of10
, proxy1of10
, proxy2of10
, proxy3of10
, proxy4of10
, proxy5of10
, proxy6of10
, proxy7of10
, proxy8of10
, proxy9of10
, proxy10of10
, proxy0of11
, proxy1of11
, proxy2of11
, proxy3of11
, proxy4of11
, proxy5of11
, proxy6of11
, proxy7of11
, proxy8of11
, proxy9of11
, proxy10of11
, proxy11of11
, proxy0of12
, proxy1of12
, proxy2of12
, proxy3of12
, proxy4of12
, proxy5of12
, proxy6of12
, proxy7of12
, proxy8of12
, proxy9of12
, proxy10of12
, proxy11of12
, proxy12of12
, proxy0of13
, proxy1of13
, proxy2of13
, proxy3of13
, proxy4of13
, proxy5of13
, proxy6of13
, proxy7of13
, proxy8of13
, proxy9of13
, proxy10of13
, proxy11of13
, proxy12of13
, proxy13of13
, proxy0of14
, proxy1of14
, proxy2of14
, proxy3of14
, proxy4of14
, proxy5of14
, proxy6of14
, proxy7of14
, proxy8of14
, proxy9of14
, proxy10of14
, proxy11of14
, proxy12of14
, proxy13of14
, proxy14of14
, proxy0of15
, proxy1of15
, proxy2of15
, proxy3of15
, proxy4of15
, proxy5of15
, proxy6of15
, proxy7of15
, proxy8of15
, proxy9of15
, proxy10of15
, proxy11of15
, proxy12of15
, proxy13of15
, proxy14of15
, proxy15of15
, proxy0of16
, proxy1of16
, proxy2of16
, proxy3of16
, proxy4of16
, proxy5of16
, proxy6of16
, proxy7of16
, proxy8of16
, proxy9of16
, proxy10of16
, proxy11of16
, proxy12of16
, proxy13of16
, proxy14of16
, proxy15of16
, proxy16of16
)
where
import GHC.TypeLits
import Data.Proxy
proxyHead :: Proxy (x ': xs) -> Proxy x
proxyHead _ = Proxy
proxyTail :: Proxy (x ': xs) -> Proxy xs
proxyTail _ = Proxy
proxyApply :: Proxy f -> Proxy a -> Proxy (f a)
proxyApply _ _ = Proxy
proxySucc :: Proxy n -> Proxy (n+1)
proxySucc _ = Proxy
proxyPred :: (1 <= n) => Proxy n -> Proxy (n1)
proxyPred _ = Proxy
proxy0of1 :: Proxy (t a) -> Proxy t
proxy0of1 _ = Proxy
proxy1of1 :: Proxy (t a) -> Proxy a
proxy1of1 _ = Proxy
proxy0of2 :: Proxy (t a b) -> Proxy t
proxy0of2 _ = Proxy
proxy1of2 :: Proxy (t a b) -> Proxy a
proxy1of2 _ = Proxy
proxy2of2 :: Proxy (t a b) -> Proxy b
proxy2of2 _ = Proxy
proxy0of3 :: Proxy (t a b c) -> Proxy t
proxy0of3 _ = Proxy
proxy1of3 :: Proxy (t a b c) -> Proxy a
proxy1of3 _ = Proxy
proxy2of3 :: Proxy (t a b c) -> Proxy b
proxy2of3 _ = Proxy
proxy3of3 :: Proxy (t a b c) -> Proxy c
proxy3of3 _ = Proxy
proxy0of4 :: Proxy (t a b c d) -> Proxy t
proxy0of4 _ = Proxy
proxy1of4 :: Proxy (t a b c d) -> Proxy a
proxy1of4 _ = Proxy
proxy2of4 :: Proxy (t a b c d) -> Proxy b
proxy2of4 _ = Proxy
proxy3of4 :: Proxy (t a b c d) -> Proxy c
proxy3of4 _ = Proxy
proxy4of4 :: Proxy (t a b c d) -> Proxy d
proxy4of4 _ = Proxy
proxy0of5 :: Proxy (t a b c d e) -> Proxy t
proxy0of5 _ = Proxy
proxy1of5 :: Proxy (t a b c d e) -> Proxy a
proxy1of5 _ = Proxy
proxy2of5 :: Proxy (t a b c d e) -> Proxy b
proxy2of5 _ = Proxy
proxy3of5 :: Proxy (t a b c d e) -> Proxy c
proxy3of5 _ = Proxy
proxy4of5 :: Proxy (t a b c d e) -> Proxy d
proxy4of5 _ = Proxy
proxy5of5 :: Proxy (t a b c d e) -> Proxy e
proxy5of5 _ = Proxy
proxy0of6 :: Proxy (t a b c d e f) -> Proxy t
proxy0of6 _ = Proxy
proxy1of6 :: Proxy (t a b c d e f) -> Proxy a
proxy1of6 _ = Proxy
proxy2of6 :: Proxy (t a b c d e f) -> Proxy b
proxy2of6 _ = Proxy
proxy3of6 :: Proxy (t a b c d e f) -> Proxy c
proxy3of6 _ = Proxy
proxy4of6 :: Proxy (t a b c d e f) -> Proxy d
proxy4of6 _ = Proxy
proxy5of6 :: Proxy (t a b c d e f) -> Proxy e
proxy5of6 _ = Proxy
proxy6of6 :: Proxy (t a b c d e f) -> Proxy f
proxy6of6 _ = Proxy
proxy0of7 :: Proxy (t a b c d e f g) -> Proxy t
proxy0of7 _ = Proxy
proxy1of7 :: Proxy (t a b c d e f g) -> Proxy a
proxy1of7 _ = Proxy
proxy2of7 :: Proxy (t a b c d e f g) -> Proxy b
proxy2of7 _ = Proxy
proxy3of7 :: Proxy (t a b c d e f g) -> Proxy c
proxy3of7 _ = Proxy
proxy4of7 :: Proxy (t a b c d e f g) -> Proxy d
proxy4of7 _ = Proxy
proxy5of7 :: Proxy (t a b c d e f g) -> Proxy e
proxy5of7 _ = Proxy
proxy6of7 :: Proxy (t a b c d e f g) -> Proxy f
proxy6of7 _ = Proxy
proxy7of7 :: Proxy (t a b c d e f g) -> Proxy g
proxy7of7 _ = Proxy
proxy0of8 :: Proxy (t a b c d e f g h) -> Proxy t
proxy0of8 _ = Proxy
proxy1of8 :: Proxy (t a b c d e f g h) -> Proxy a
proxy1of8 _ = Proxy
proxy2of8 :: Proxy (t a b c d e f g h) -> Proxy b
proxy2of8 _ = Proxy
proxy3of8 :: Proxy (t a b c d e f g h) -> Proxy c
proxy3of8 _ = Proxy
proxy4of8 :: Proxy (t a b c d e f g h) -> Proxy d
proxy4of8 _ = Proxy
proxy5of8 :: Proxy (t a b c d e f g h) -> Proxy e
proxy5of8 _ = Proxy
proxy6of8 :: Proxy (t a b c d e f g h) -> Proxy f
proxy6of8 _ = Proxy
proxy7of8 :: Proxy (t a b c d e f g h) -> Proxy g
proxy7of8 _ = Proxy
proxy8of8 :: Proxy (t a b c d e f g h) -> Proxy h
proxy8of8 _ = Proxy
proxy0of9 :: Proxy (t a b c d e f g h i) -> Proxy t
proxy0of9 _ = Proxy
proxy1of9 :: Proxy (t a b c d e f g h i) -> Proxy a
proxy1of9 _ = Proxy
proxy2of9 :: Proxy (t a b c d e f g h i) -> Proxy b
proxy2of9 _ = Proxy
proxy3of9 :: Proxy (t a b c d e f g h i) -> Proxy c
proxy3of9 _ = Proxy
proxy4of9 :: Proxy (t a b c d e f g h i) -> Proxy d
proxy4of9 _ = Proxy
proxy5of9 :: Proxy (t a b c d e f g h i) -> Proxy e
proxy5of9 _ = Proxy
proxy6of9 :: Proxy (t a b c d e f g h i) -> Proxy f
proxy6of9 _ = Proxy
proxy7of9 :: Proxy (t a b c d e f g h i) -> Proxy g
proxy7of9 _ = Proxy
proxy8of9 :: Proxy (t a b c d e f g h i) -> Proxy h
proxy8of9 _ = Proxy
proxy9of9 :: Proxy (t a b c d e f g h i) -> Proxy i
proxy9of9 _ = Proxy
proxy0of10 :: Proxy (t a b c d e f g h i j) -> Proxy t
proxy0of10 _ = Proxy
proxy1of10 :: Proxy (t a b c d e f g h i j) -> Proxy a
proxy1of10 _ = Proxy
proxy2of10 :: Proxy (t a b c d e f g h i j) -> Proxy b
proxy2of10 _ = Proxy
proxy3of10 :: Proxy (t a b c d e f g h i j) -> Proxy c
proxy3of10 _ = Proxy
proxy4of10 :: Proxy (t a b c d e f g h i j) -> Proxy d
proxy4of10 _ = Proxy
proxy5of10 :: Proxy (t a b c d e f g h i j) -> Proxy e
proxy5of10 _ = Proxy
proxy6of10 :: Proxy (t a b c d e f g h i j) -> Proxy f
proxy6of10 _ = Proxy
proxy7of10 :: Proxy (t a b c d e f g h i j) -> Proxy g
proxy7of10 _ = Proxy
proxy8of10 :: Proxy (t a b c d e f g h i j) -> Proxy h
proxy8of10 _ = Proxy
proxy9of10 :: Proxy (t a b c d e f g h i j) -> Proxy i
proxy9of10 _ = Proxy
proxy10of10 :: Proxy (t a b c d e f g h i j) -> Proxy j
proxy10of10 _ = Proxy
proxy0of11 :: Proxy (t a b c d e f g h i j k) -> Proxy t
proxy0of11 _ = Proxy
proxy1of11 :: Proxy (t a b c d e f g h i j k) -> Proxy a
proxy1of11 _ = Proxy
proxy2of11 :: Proxy (t a b c d e f g h i j k) -> Proxy b
proxy2of11 _ = Proxy
proxy3of11 :: Proxy (t a b c d e f g h i j k) -> Proxy c
proxy3of11 _ = Proxy
proxy4of11 :: Proxy (t a b c d e f g h i j k) -> Proxy d
proxy4of11 _ = Proxy
proxy5of11 :: Proxy (t a b c d e f g h i j k) -> Proxy e
proxy5of11 _ = Proxy
proxy6of11 :: Proxy (t a b c d e f g h i j k) -> Proxy f
proxy6of11 _ = Proxy
proxy7of11 :: Proxy (t a b c d e f g h i j k) -> Proxy g
proxy7of11 _ = Proxy
proxy8of11 :: Proxy (t a b c d e f g h i j k) -> Proxy h
proxy8of11 _ = Proxy
proxy9of11 :: Proxy (t a b c d e f g h i j k) -> Proxy i
proxy9of11 _ = Proxy
proxy10of11 :: Proxy (t a b c d e f g h i j k) -> Proxy j
proxy10of11 _ = Proxy
proxy11of11 :: Proxy (t a b c d e f g h i j k) -> Proxy k
proxy11of11 _ = Proxy
proxy0of12 :: Proxy (t a b c d e f g h i j k l) -> Proxy t
proxy0of12 _ = Proxy
proxy1of12 :: Proxy (t a b c d e f g h i j k l) -> Proxy a
proxy1of12 _ = Proxy
proxy2of12 :: Proxy (t a b c d e f g h i j k l) -> Proxy b
proxy2of12 _ = Proxy
proxy3of12 :: Proxy (t a b c d e f g h i j k l) -> Proxy c
proxy3of12 _ = Proxy
proxy4of12 :: Proxy (t a b c d e f g h i j k l) -> Proxy d
proxy4of12 _ = Proxy
proxy5of12 :: Proxy (t a b c d e f g h i j k l) -> Proxy e
proxy5of12 _ = Proxy
proxy6of12 :: Proxy (t a b c d e f g h i j k l) -> Proxy f
proxy6of12 _ = Proxy
proxy7of12 :: Proxy (t a b c d e f g h i j k l) -> Proxy g
proxy7of12 _ = Proxy
proxy8of12 :: Proxy (t a b c d e f g h i j k l) -> Proxy h
proxy8of12 _ = Proxy
proxy9of12 :: Proxy (t a b c d e f g h i j k l) -> Proxy i
proxy9of12 _ = Proxy
proxy10of12 :: Proxy (t a b c d e f g h i j k l) -> Proxy j
proxy10of12 _ = Proxy
proxy11of12 :: Proxy (t a b c d e f g h i j k l) -> Proxy k
proxy11of12 _ = Proxy
proxy12of12 :: Proxy (t a b c d e f g h i j k l) -> Proxy l
proxy12of12 _ = Proxy
proxy0of13 :: Proxy (t a b c d e f g h i j k l m) -> Proxy t
proxy0of13 _ = Proxy
proxy1of13 :: Proxy (t a b c d e f g h i j k l m) -> Proxy a
proxy1of13 _ = Proxy
proxy2of13 :: Proxy (t a b c d e f g h i j k l m) -> Proxy b
proxy2of13 _ = Proxy
proxy3of13 :: Proxy (t a b c d e f g h i j k l m) -> Proxy c
proxy3of13 _ = Proxy
proxy4of13 :: Proxy (t a b c d e f g h i j k l m) -> Proxy d
proxy4of13 _ = Proxy
proxy5of13 :: Proxy (t a b c d e f g h i j k l m) -> Proxy e
proxy5of13 _ = Proxy
proxy6of13 :: Proxy (t a b c d e f g h i j k l m) -> Proxy f
proxy6of13 _ = Proxy
proxy7of13 :: Proxy (t a b c d e f g h i j k l m) -> Proxy g
proxy7of13 _ = Proxy
proxy8of13 :: Proxy (t a b c d e f g h i j k l m) -> Proxy h
proxy8of13 _ = Proxy
proxy9of13 :: Proxy (t a b c d e f g h i j k l m) -> Proxy i
proxy9of13 _ = Proxy
proxy10of13 :: Proxy (t a b c d e f g h i j k l m) -> Proxy j
proxy10of13 _ = Proxy
proxy11of13 :: Proxy (t a b c d e f g h i j k l m) -> Proxy k
proxy11of13 _ = Proxy
proxy12of13 :: Proxy (t a b c d e f g h i j k l m) -> Proxy l
proxy12of13 _ = Proxy
proxy13of13 :: Proxy (t a b c d e f g h i j k l m) -> Proxy m
proxy13of13 _ = Proxy
proxy0of14 :: Proxy (t a b c d e f g h i j k l m n) -> Proxy t
proxy0of14 _ = Proxy
proxy1of14 :: Proxy (t a b c d e f g h i j k l m n) -> Proxy a
proxy1of14 _ = Proxy
proxy2of14 :: Proxy (t a b c d e f g h i j k l m n) -> Proxy b
proxy2of14 _ = Proxy
proxy3of14 :: Proxy (t a b c d e f g h i j k l m n) -> Proxy c
proxy3of14 _ = Proxy
proxy4of14 :: Proxy (t a b c d e f g h i j k l m n) -> Proxy d
proxy4of14 _ = Proxy
proxy5of14 :: Proxy (t a b c d e f g h i j k l m n) -> Proxy e
proxy5of14 _ = Proxy
proxy6of14 :: Proxy (t a b c d e f g h i j k l m n) -> Proxy f
proxy6of14 _ = Proxy
proxy7of14 :: Proxy (t a b c d e f g h i j k l m n) -> Proxy g
proxy7of14 _ = Proxy
proxy8of14 :: Proxy (t a b c d e f g h i j k l m n) -> Proxy h
proxy8of14 _ = Proxy
proxy9of14 :: Proxy (t a b c d e f g h i j k l m n) -> Proxy i
proxy9of14 _ = Proxy
proxy10of14 :: Proxy (t a b c d e f g h i j k l m n) -> Proxy j
proxy10of14 _ = Proxy
proxy11of14 :: Proxy (t a b c d e f g h i j k l m n) -> Proxy k
proxy11of14 _ = Proxy
proxy12of14 :: Proxy (t a b c d e f g h i j k l m n) -> Proxy l
proxy12of14 _ = Proxy
proxy13of14 :: Proxy (t a b c d e f g h i j k l m n) -> Proxy m
proxy13of14 _ = Proxy
proxy14of14 :: Proxy (t a b c d e f g h i j k l m n) -> Proxy n
proxy14of14 _ = Proxy
proxy0of15 :: Proxy (t a b c d e f g h i j k l m n o) -> Proxy t
proxy0of15 _ = Proxy
proxy1of15 :: Proxy (t a b c d e f g h i j k l m n o) -> Proxy a
proxy1of15 _ = Proxy
proxy2of15 :: Proxy (t a b c d e f g h i j k l m n o) -> Proxy b
proxy2of15 _ = Proxy
proxy3of15 :: Proxy (t a b c d e f g h i j k l m n o) -> Proxy c
proxy3of15 _ = Proxy
proxy4of15 :: Proxy (t a b c d e f g h i j k l m n o) -> Proxy d
proxy4of15 _ = Proxy
proxy5of15 :: Proxy (t a b c d e f g h i j k l m n o) -> Proxy e
proxy5of15 _ = Proxy
proxy6of15 :: Proxy (t a b c d e f g h i j k l m n o) -> Proxy f
proxy6of15 _ = Proxy
proxy7of15 :: Proxy (t a b c d e f g h i j k l m n o) -> Proxy g
proxy7of15 _ = Proxy
proxy8of15 :: Proxy (t a b c d e f g h i j k l m n o) -> Proxy h
proxy8of15 _ = Proxy
proxy9of15 :: Proxy (t a b c d e f g h i j k l m n o) -> Proxy i
proxy9of15 _ = Proxy
proxy10of15 :: Proxy (t a b c d e f g h i j k l m n o) -> Proxy j
proxy10of15 _ = Proxy
proxy11of15 :: Proxy (t a b c d e f g h i j k l m n o) -> Proxy k
proxy11of15 _ = Proxy
proxy12of15 :: Proxy (t a b c d e f g h i j k l m n o) -> Proxy l
proxy12of15 _ = Proxy
proxy13of15 :: Proxy (t a b c d e f g h i j k l m n o) -> Proxy m
proxy13of15 _ = Proxy
proxy14of15 :: Proxy (t a b c d e f g h i j k l m n o) -> Proxy n
proxy14of15 _ = Proxy
proxy15of15 :: Proxy (t a b c d e f g h i j k l m n o) -> Proxy o
proxy15of15 _ = Proxy
proxy0of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy t
proxy0of16 _ = Proxy
proxy1of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy a
proxy1of16 _ = Proxy
proxy2of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy b
proxy2of16 _ = Proxy
proxy3of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy c
proxy3of16 _ = Proxy
proxy4of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy d
proxy4of16 _ = Proxy
proxy5of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy e
proxy5of16 _ = Proxy
proxy6of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy f
proxy6of16 _ = Proxy
proxy7of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy g
proxy7of16 _ = Proxy
proxy8of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy h
proxy8of16 _ = Proxy
proxy9of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy i
proxy9of16 _ = Proxy
proxy10of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy j
proxy10of16 _ = Proxy
proxy11of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy k
proxy11of16 _ = Proxy
proxy12of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy l
proxy12of16 _ = Proxy
proxy13of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy m
proxy13of16 _ = Proxy
proxy14of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy n
proxy14of16 _ = Proxy
proxy15of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy o
proxy15of16 _ = Proxy
proxy16of16 :: Proxy (t a b c d e f g h i j k l m n o p) -> Proxy p
proxy16of16 _ = Proxy