{-# LANGUAGE TemplateHaskell #-}
module Futhark.CodeGen.RTS.Python
( memoryPy,
openclPy,
panicPy,
scalarPy,
serverPy,
tuningPy,
valuesPy,
)
where
import Data.FileEmbed
import Data.Text qualified as T
memoryPy :: T.Text
memoryPy :: Text
memoryPy = $(embedStringFile "rts/python/memory.py")
openclPy :: T.Text
openclPy :: Text
openclPy = $(embedStringFile "rts/python/opencl.py")
panicPy :: T.Text
panicPy :: Text
panicPy = $(embedStringFile "rts/python/panic.py")
scalarPy :: T.Text
scalarPy :: Text
scalarPy = $(embedStringFile "rts/python/scalar.py")
serverPy :: T.Text
serverPy :: Text
serverPy = $(embedStringFile "rts/python/server.py")
tuningPy :: T.Text
tuningPy :: Text
tuningPy = $(embedStringFile "rts/python/tuning.py")
valuesPy :: T.Text
valuesPy :: Text
valuesPy = $(embedStringFile "rts/python/values.py")