Difference between revisions of "GPipe"

From HaskellWiki
Jump to navigation Jump to search
m
(Adding Vec, removing Vec-Transform)
(21 intermediate revisions by 3 users not shown)
Line 1: Line 1:
  +
== What is GPipe? ==
This is the official wiki for the [http://hackage.haskell.org/package/GPipe GPipe package].
 
   
  +
[http://hackage.haskell.org/package/GPipe GPipe] is a library for programming the GPU (graphics processing unit). It is an alternative to using OpenGl, and has the advantage that it is purely functional, statically typed and operates on immutable data as opposed to OpenGl's inherently imperative style. Another important difference with OpenGl is that with GPipe you don't need to write shaders in a second shader language such as GLSL or Cg, but instead use regular Haskell functions on the GPU data types. GPipe uses the same conceptual model as OpenGl, and it is recommended that you have at least a basic understanding of how OpenGl works to be able to use GPipe.
== Example ==
 
This is a simple GPipe example that animates a spinning box. Besides GPipe, it uses the
 
[http://hackage.haskell.org/package/Vec-Transform Vec-Transform package] for the transformation matrices.
 
   
  +
== Examples and tutorials ==
I will continue adding examples to this page, so check back every once in a while. If you have any questions, feel free to [mailto:tobias_bexelius@hotmail.com mail] me.
 
   
  +
* Wiki [[/Tutorial/]] that explains the basic principles of GPipe.
<haskell>
 
  +
* [http://hackage.haskell.org/package/GPipe-Examples GPipe-Examples package], by Kree Cole-McLaughlin features a set of four examples with increasing complexity.
module Main where
 
  +
* Csaba Hruska has made a Quake 3 map viewer using GPipe, sources on [https://github.com/csabahruska/GFXDemo GitHub].
   
 
== Sources ==
import Graphics.GPipe
 
import Data.Monoid
 
import Data.IORef
 
import qualified Data.Vec as Vec
 
import Data.Vec.Nat
 
import Data.Vec.LinAlg.Transform3D
 
import Graphics.UI.GLUT
 
(mainLoop,
 
postRedisplay,
 
idleCallback,
 
getArgsAndInitialize,
 
($=))
 
   
  +
All my GPipe related library sources are available on [http://github.com/tobbebex Github]. If you have something to contribute with, just send me a patch and I might merge it into the trunk.
sidePosX = toGPUStream TriangleStrip $ map (flip (,) (1:.0:.0:.())) [1:.0:.0:.(), 1:.1:.0:.(), 1:.0:.1:.(), 1:.1:.1:.()]
 
sideNegX = toGPUStream TriangleStrip $ map (flip (,) ((-1):.0:.0:.())) [0:.0:.1:.(), 0:.1:.1:.(), 0:.0:.0:.(), 0:.1:.0:.()]
 
sidePosY = toGPUStream TriangleStrip $ map (flip (,) (0:.1:.0:.())) [0:.1:.1:.(), 1:.1:.1:.(), 0:.1:.0:.(), 1:.1:.0:.()]
 
sideNegY = toGPUStream TriangleStrip $ map (flip (,) (0:.(-1):.0:.())) [0:.0:.0:.(), 1:.0:.0:.(), 0:.0:.1:.(), 1:.0:.1:.()]
 
sidePosZ = toGPUStream TriangleStrip $ map (flip (,) (0:.0:.1:.())) [1:.0:.1:.(), 1:.1:.1:.(), 0:.0:.1:.(), 0:.1:.1:.()]
 
sideNegZ = toGPUStream TriangleStrip $ map (flip (,) (0:.0:.(-1):.())) [0:.0:.0:.(), 0:.1:.0:.(), 1:.0:.0:.(), 1:.1:.0:.()]
 
   
  +
== Other resources ==
cube = mconcat [sidePosX, sideNegX, sidePosY, sideNegY, sidePosZ, sideNegZ]
 
   
  +
* [http://hackage.haskell.org/package/GLUT GLUT] is used in GPipe for window management and the main loop.
transformedCube a = fmap (transform a) cube
 
 
* [http://hackage.haskell.org/package/Vec Vec package] is the vector math package used by GPipe.
transform :: Float -> (Vec3 (Vertex Float), Vec3 (Vertex Float)) -> (Vec4 (Vertex Float), Vec3 (Vertex Float))
 
  +
* [http://hackage.haskell.org/package/GPipe-TextureLoad GPipe-TextureLoad package] helps loading textures from disc.
transform a (pos, norm) = (transformedPos, transformedNorm)
 
  +
* [http://hackage.haskell.org/package/GPipe-Collada GPipe-Collada package] makes it possible to use Collada files with GPipe.
where
 
modelMat = rotationVec (normalize (1:.0.5:.0.3:.())) a `multmm` translation (-0.5)
 
viewMat = translation (-(0:.0:.2:.()))
 
projMat = perspective 1 100 (pi/3) (4/3)
 
viewProjMat = projMat `multmm` viewMat
 
transformedPos = toGPU (viewProjMat `multmm` modelMat) `multmv` homPoint pos
 
transformedNorm = toGPU (Vec.map (Vec.take n3) $ Vec.take n3 $ modelMat) `multmv` norm
 
   
  +
== Questions and feedback ==
coloredFragments a = fmap (RGB . Vec.vec . dot (toGPU (0:.0:.1:.()))) $ rasterizeFront $ transformedCube a
 
   
  +
If you have any questions or suggestions, feel free to [mailto:tobias_bexelius@hotmail.com mail] me. I'm also interested in seeing some use cases from the community, as complex or trivial they may be.
paintSolid = paintColor NoBlending (RGB $ Vec.vec True)
 
   
  +
[[Category:3D]]
main = do getArgsAndInitialize
 
  +
[[Category:Graphics]]
angleRef <- newIORef 0.0
 
  +
[[Category:Libraries]]
newWindow "Spinning box" (100:.100:.()) (800:.600:.())
 
  +
[[Category:Packages]]
(do angle <- readIORef angleRef
 
writeIORef angleRef ((angle + 0.01) `mod'` (2*pi))
 
return $ paintSolid (coloredFragments angle) (newFrameBufferColor (RGB 0))
 
)
 
(\ w -> idleCallback $= Just (postRedisplay (Just w)))
 
mainLoop
 
 
 
</haskell>
 
 
[[Image:box.jpg]]
 

Revision as of 16:52, 6 August 2012

What is GPipe?

GPipe is a library for programming the GPU (graphics processing unit). It is an alternative to using OpenGl, and has the advantage that it is purely functional, statically typed and operates on immutable data as opposed to OpenGl's inherently imperative style. Another important difference with OpenGl is that with GPipe you don't need to write shaders in a second shader language such as GLSL or Cg, but instead use regular Haskell functions on the GPU data types. GPipe uses the same conceptual model as OpenGl, and it is recommended that you have at least a basic understanding of how OpenGl works to be able to use GPipe.

Examples and tutorials

  • Wiki Tutorial that explains the basic principles of GPipe.
  • GPipe-Examples package, by Kree Cole-McLaughlin features a set of four examples with increasing complexity.
  • Csaba Hruska has made a Quake 3 map viewer using GPipe, sources on GitHub.

Sources

All my GPipe related library sources are available on Github. If you have something to contribute with, just send me a patch and I might merge it into the trunk.

Other resources

Questions and feedback

If you have any questions or suggestions, feel free to mail me. I'm also interested in seeing some use cases from the community, as complex or trivial they may be.