{-# LANGUAGE Safe #-}
{-# LANGUAGE TypeFamilies #-}
module Copilot.Language.Operators.Array
( (.!!)
) where
import Copilot.Core ( Typed
, Op2 (Index)
, typeOf
, Array
)
import Copilot.Language.Stream (Stream (..))
import Data.Word (Word32)
import GHC.TypeLits (KnownNat)
(.!!) :: ( KnownNat n
, Typed t
) => Stream (Array n t) -> Stream Word32 -> Stream t
Stream (Array n t)
arr .!! :: forall (n :: Nat) t.
(KnownNat n, Typed t) =>
Stream (Array n t) -> Stream Word32 -> Stream t
.!! Stream Word32
n = forall a b c.
(Typed a, Typed b, Typed c) =>
Op2 a b c -> Stream a -> Stream b -> Stream c
Op2 (forall (n :: Nat) c. Type (Array n c) -> Op2 (Array n c) Word32 c
Index forall a. Typed a => Type a
typeOf) Stream (Array n t)
arr Stream Word32
n