-- | Provides the paths to the jars needed to build with jvm-batching.
module Language.Java.Batching.Jars where

import Paths_jvm_batching (getDataFileName)

getJars :: IO [String]
getJars :: IO [String]
getJars = (String -> [String] -> [String]
forall a. a -> [a] -> [a]
:[]) (String -> [String]) -> IO String -> IO [String]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> String -> IO String
getDataFileName String
"build/libs/jvm-batching.jar"