-- GENERATED by C->Haskell Compiler, version 0.16.3 Crystal Seed, 24 Jan 2009 (Haskell)
-- Edit the ORIGNAL .chs file instead!


{-# LINE 1 ".\\HGamer3D\\Bindings\\SFML\\EnumKey.chs" #-}{-# LANGUAGE ForeignFunctionInterface #-}
{-# LANGUAGE TypeSynonymInstances #-}

-- This source file is part of HGamer3D
-- (A project to enable 3D game development in Haskell)
-- For the latest info, see http://www.althainz.de/HGamer3D.html
-- 

-- (c) 2011, 2012 Peter Althainz
-- 
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
-- 
--     http://www.apache.org/licenses/LICENSE-2.0
-- 
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-- 


-- EnumKey.chs

-- 

module HGamer3D.Bindings.SFML.EnumKey where

import Foreign
import Foreign.Ptr
import Foreign.C

import HGamer3D.Data.HG3DClass
import HGamer3D.Data.Vector
import HGamer3D.Data.Colour
import HGamer3D.Data.Angle


data EnumKey = KeyA
             | KeyB
             | KeyC
             | KeyD
             | KeyE
             | KeyF
             | KeyG
             | KeyH
             | KeyI
             | KeyJ
             | KeyK
             | KeyL
             | KeyM
             | KeyN
             | KeyO
             | KeyP
             | KeyQ
             | KeyR
             | KeyS
             | KeyT
             | KeyU
             | KeyV
             | KeyW
             | KeyX
             | KeyY
             | KeyZ
             | KeyNum0
             | KeyNum1
             | KeyNum2
             | KeyNum3
             | KeyNum4
             | KeyNum5
             | KeyNum6
             | KeyNum7
             | KeyNum8
             | KeyNum9
             | KeyEscape
             | KeyLControl
             | KeyLShift
             | KeyLAlt
             | KeyLSystem
             | KeyRControl
             | KeyRShift
             | KeyRAlt
             | KeyRSystem
             | KeyMenu
             | KeyLBracket
             | KeyRBracket
             | KeySemiColon
             | KeyComma
             | KeyPeriod
             | KeyQuote
             | KeySlash
             | KeyBackSlash
             | KeyTilde
             | KeyEqual
             | KeyDash
             | KeySpace
             | KeyReturn
             | KeyBack
             | KeyTab
             | KeyPageUp
             | KeyPageDown
             | KeyEnd
             | KeyHome
             | KeyInsert
             | KeyDelete
             | KeyAdd
             | KeySubtract
             | KeyMultiply
             | KeyDivide
             | KeyLeft
             | KeyRight
             | KeyUp
             | KeyDown
             | KeyNumpad0
             | KeyNumpad1
             | KeyNumpad2
             | KeyNumpad3
             | KeyNumpad4
             | KeyNumpad5
             | KeyNumpad6
             | KeyNumpad7
             | KeyNumpad8
             | KeyNumpad9
             | KeyF1
             | KeyF2
             | KeyF3
             | KeyF4
             | KeyF5
             | KeyF6
             | KeyF7
             | KeyF8
             | KeyF9
             | KeyF10
             | KeyF11
             | KeyF12
             | KeyF13
             | KeyF14
             | KeyF15
             | KeyPause
             | KeyKeyCount
             deriving (Enum,Eq)