{-# LANGUAGE PolyKinds, UndecidableInstances #-}
{-# OPTIONS_GHC -fno-warn-unused-binds #-}
module Data.SOP (
NP(..)
, NS(..)
, SOP(..)
, unSOP
, POP(..)
, unPOP
, HPure(..)
, hd
, tl
, Projection
, projections
, shiftProjection
, type (-.->)(..)
, fn
, fn_2
, fn_3
, fn_4
, Prod
, HAp(..)
, hliftA
, hliftA2
, hliftA3
, hcliftA
, hcliftA2
, hcliftA3
, hmap
, hzipWith
, hzipWith3
, hcmap
, hczipWith
, hczipWith3
, Injection
, injections
, shift
, shiftInjection
, UnProd
, HApInjs(..)
, apInjs_NP
, apInjs_POP
, unZ
, HIndex(..)
, hcliftA'
, hcliftA2'
, hcliftA3'
, compare_NS
, ccompare_NS
, compare_SOP
, ccompare_SOP
, CollapseTo
, HCollapse(..)
, HTraverse_(..)
, hcfoldMap
, hcfor_
, HSequence(..)
, hsequence
, hsequenceK
, hctraverse
, hcfor
, HExpand(..)
, HTrans(..)
, hfromI
, htoI
, fromList
, K(..)
, unK
, I(..)
, unI
, (:.:)(..)
, unComp
, mapII
, mapIK
, mapKI
, mapKK
, mapIII
, mapIIK
, mapIKI
, mapIKK
, mapKII
, mapKIK
, mapKKI
, mapKKK
, All
, All2
, cpara_SList
, ccase_SList
, AllZip
, AllZip2
, AllN
, AllZipN
, Compose
, And
, Top
, LiftedCoercible
, SameShapeAs
, SList(..)
, SListI
, SListI2
, sList
, para_SList
, case_SList
, Shape(..)
, shape
, lengthSList
#ifndef MIN_TOOL_VERSION_haddock
#define MIN_TOOL_VERSION_haddock(x,y,z) 0
#endif
#if !(defined(__HADDOCK_VERSION__)) || MIN_TOOL_VERSION_haddock(2,14,0)
, Proxy(..)
#endif
) where
import Data.Proxy (Proxy(..))
import Data.SOP.BasicFunctors
import Data.SOP.Classes
import Data.SOP.Constraint
import Data.SOP.NP
import Data.SOP.NS
import Data.SOP.Sing