{-# LANGUAGE Trustworthy #-}

module Vector (fromList, toList, mapMaybe) where

import Data.Maybe (Maybe)
import Data.Vector (Vector)
import Data.Vector qualified as V

fromList :: [a] -> Vector a
fromList :: forall a. [a] -> Vector a
fromList = forall a. [a] -> Vector a
V.fromList

toList :: Vector a -> [a]
toList :: forall a. Vector a -> [a]
toList = forall a. Vector a -> [a]
V.toList

mapMaybe :: (a -> Maybe b) -> Vector a -> Vector b
mapMaybe :: forall a b. (a -> Maybe b) -> Vector a -> Vector b
mapMaybe = forall a b. (a -> Maybe b) -> Vector a -> Vector b
V.mapMaybe