/libs/graphics/GLSL/src/Language/GLSL/Lex.x

http://copperbox.googlecode.com/ · Alex · 303 lines · 216 code · 87 blank · 0 comment · 0 complexity · d5e726743e789e5b00595b3fff818a69 MD5 · raw file

  1. --------------------------------------------------------------------------------
  2. -- |
  3. -- Module : Language.GLSL.Lex
  4. -- Copyright : (c) Stephen Tetley 2009
  5. -- License : BSD-style (see the LICENSE file in the distribution)
  6. --
  7. -- Maintainer : Stephen Tetley <stephen.tetley@gmail.com>
  8. -- Stability : highly unstable
  9. -- Portability : GHC
  10. --
  11. -- Lexer
  12. --
  13. --------------------------------------------------------------------------------
  14. {
  15. {-# OPTIONS -Wall #-}
  16. module Language.GLSL.Lex where
  17. import Language.GLSL.ParseMonad
  18. import Language.GLSL.Token
  19. import Control.Applicative
  20. import Control.Monad.Identity
  21. }
  22. $white = [\ \t\v\f\r\n]
  23. $nondigit = [A-Za-z_]
  24. $digit = 0-9
  25. $nonzero_digit = [1-9]
  26. $octal_digit = [0-7]
  27. $hex_digit = [0-9A-Fa-f]
  28. $identifier_nondigit = $nondigit
  29. $identifier = [$nondigit $digit]
  30. @hex_prefix = 0x | 0X
  31. @integer = $digit+
  32. @float = $digit+ \. $digit+
  33. glsl :-
  34. $white ;
  35. -- Comment - cpp -E seems to fill in with lines like `# 1 "<command line>"`
  36. <0> {
  37. ^\# [.]* { skip }
  38. ^\/\/[.]* { skip }
  39. }
  40. -- keywords
  41. <0> {
  42. "attribute" { keyword Tk_kw_attribute }
  43. "const" { keyword Tk_kw_const }
  44. "bool" { keyword Tk_kw_bool }
  45. "float" { keyword Tk_kw_float }
  46. "int" { keyword Tk_kw_int }
  47. "break" { keyword Tk_kw_break }
  48. "continue" { keyword Tk_kw_continue }
  49. "do" { keyword Tk_kw_do }
  50. "else" { keyword Tk_kw_else }
  51. "for" { keyword Tk_kw_for }
  52. "if" { keyword Tk_kw_if }
  53. "discard" { keyword Tk_kw_discard }
  54. "return" { keyword Tk_kw_return }
  55. "bvec2" { keyword Tk_kw_bvec2 }
  56. "bvec3" { keyword Tk_kw_bvec3 }
  57. "bvec4" { keyword Tk_kw_bvec4 }
  58. "ivec2" { keyword Tk_kw_ivec2 }
  59. "ivec3" { keyword Tk_kw_ivec3 }
  60. "ivec4" { keyword Tk_kw_ivec4 }
  61. "vec2" { keyword Tk_kw_vec2 }
  62. "vec3" { keyword Tk_kw_vec3 }
  63. "vec4" { keyword Tk_kw_vec4 }
  64. "mat2" { keyword Tk_kw_mat2 }
  65. "mat3" { keyword Tk_kw_mat3 }
  66. "mat4" { keyword Tk_kw_mat4 }
  67. "in" { keyword Tk_kw_in }
  68. "out" { keyword Tk_kw_out }
  69. "inout" { keyword Tk_kw_inout }
  70. "uniform" { keyword Tk_kw_uniform }
  71. "varying" { keyword Tk_kw_varying }
  72. "centroid" { keyword Tk_kw_centroid }
  73. "mat2x2" { keyword Tk_kw_mat2x2 }
  74. "mat2x3" { keyword Tk_kw_mat2x3 }
  75. "mat2x4" { keyword Tk_kw_mat2x4 }
  76. "mat3x2" { keyword Tk_kw_mat3x2 }
  77. "mat3x3" { keyword Tk_kw_mat3x3 }
  78. "mat3x4" { keyword Tk_kw_mat3x4 }
  79. "mat4x2" { keyword Tk_kw_mat4x2 }
  80. "mat4x3" { keyword Tk_kw_mat4x3 }
  81. "mat4x4" { keyword Tk_kw_mat4x4 }
  82. "sampler1D" { keyword Tk_kw_sampler1D }
  83. "sampler2D" { keyword Tk_kw_sampler2D }
  84. "sampler3D" { keyword Tk_kw_sampler3D }
  85. "samplerCube" { keyword Tk_kw_samplerCube }
  86. "sampler1DShadow" { keyword Tk_kw_sampler1DShadow }
  87. "sampler2DShadow" { keyword Tk_kw_sampler2DShadow }
  88. "struct" { keyword Tk_kw_struct }
  89. "void" { keyword Tk_kw_void }
  90. "while" { keyword Tk_kw_while }
  91. "invariant" { keyword Tk_kw_invariant }
  92. }
  93. -- identifier
  94. <0> {
  95. $identifier_nondigit $identifier* { identifier }
  96. }
  97. -- operators
  98. <0> {
  99. "<<" { operator Tk_left_op }
  100. ">>" { operator Tk_right_op }
  101. "++" { operator Tk_inc_op }
  102. "--" { operator Tk_dec_op }
  103. "<=" { operator Tk_le_op }
  104. ">=" { operator Tk_ge_op }
  105. "==" { operator Tk_eq_op }
  106. "!=" { operator Tk_ne_op }
  107. \& { operator Tk_and_op }
  108. \| { operator Tk_or_op }
  109. \^ { operator Tk_xor_op }
  110. "*=" { operator Tk_mul_assign }
  111. "/=" { operator Tk_div_assign }
  112. "+=" { operator Tk_add_assign }
  113. "%=" { operator Tk_mod_assign }
  114. "<<=" { operator Tk_left_assign }
  115. ">>=" { operator Tk_right_assign }
  116. "&=" { operator Tk_and_assign }
  117. "^=" { operator Tk_xor_assign }
  118. "|=" { operator Tk_or_assign }
  119. "-=" { operator Tk_sub_assign }
  120. }
  121. -- punctuators
  122. <0> {
  123. \( { punctuator Tk_p_left_paren }
  124. \) { punctuator Tk_p_right_paren }
  125. \[ { punctuator Tk_p_left_bracket }
  126. \] { punctuator Tk_p_right_bracket }
  127. \{ { punctuator Tk_p_left_brace }
  128. \} { punctuator Tk_p_right_brace }
  129. \. { punctuator Tk_p_dot }
  130. \, { punctuator Tk_p_comma }
  131. \: { punctuator Tk_p_colon }
  132. \= { punctuator Tk_p_equal }
  133. \; { punctuator Tk_p_semicolon }
  134. \! { punctuator Tk_p_bang }
  135. \- { punctuator Tk_p_dash }
  136. \~ { punctuator Tk_p_tilde }
  137. \+ { punctuator Tk_p_plus }
  138. \* { punctuator Tk_p_star }
  139. \/ { punctuator Tk_p_slash }
  140. \% { punctuator Tk_p_percent }
  141. \< { punctuator Tk_p_left_angle }
  142. \> { punctuator Tk_p_right_angle }
  143. \| { punctuator Tk_p_vertical_bar }
  144. \^ { punctuator Tk_p_caret }
  145. \& { punctuator Tk_p_ampersand }
  146. \? { punctuator Tk_p_question }
  147. }
  148. -- integer constants
  149. <0> {
  150. $nonzero_digit $digit* { intLiteral }
  151. 0 $octal_digit* { octLiteral }
  152. @hex_prefix $hex_digit* { hexLiteral }
  153. }
  154. -- float constants
  155. <0> {
  156. @float { floatLiteral }
  157. }
  158. {
  159. type ParseM a = ParseT Identity a
  160. alexEOF :: (Functor m, Monad m) => ParseT m Lexeme
  161. alexEOF = (\pos -> L pos Tk_EOF) <$> getPosition
  162. intLiteral :: AlexInput -> Int -> ParseM Lexeme
  163. intLiteral = usingInput L (Tk_lit_int . read)
  164. -- TODO - watch out for an error on read
  165. octLiteral :: AlexInput -> Int -> ParseM Lexeme
  166. octLiteral = usingInput L (Tk_lit_int . read . traf)
  167. where
  168. traf ('0':s) = '0':'o':s
  169. traf s = s -- this will probably cause a read error which is bad
  170. hexLiteral :: AlexInput -> Int -> ParseM Lexeme
  171. hexLiteral = usingInput L (Tk_lit_int . read)
  172. floatLiteral :: AlexInput -> Int -> ParseM Lexeme
  173. floatLiteral = usingInput L Tk_lit_float
  174. boolLiteral :: AlexInput -> Int -> ParseM Lexeme
  175. boolLiteral = usingInput L (Tk_lit_bool . fn)
  176. where
  177. fn "true" = True
  178. fn "false" = False
  179. keyword :: GlslToken -> AlexInput -> Int -> ParseM Lexeme
  180. keyword kw = usingInput L (const kw)
  181. punctuator :: GlslToken -> AlexInput -> Int -> ParseM Lexeme
  182. punctuator pr = usingInput L (const pr)
  183. operator :: GlslToken -> AlexInput -> Int -> ParseM Lexeme
  184. operator op = usingInput L (const op)
  185. identifier :: AlexInput -> Int -> ParseM Lexeme
  186. identifier = usingInput L Tk_ident
  187. glslLex :: (Lexeme -> ParseM a) -> ParseM a
  188. glslLex k = lexToken >>= k
  189. --------------------------------------------------------------------------------
  190. --
  191. -- These functions are generic, but as the type AlexReturn(..) is
  192. -- generated by Alex we can't move them into ParseMonad without a circular
  193. -- dependency.
  194. -- Seemingly we have to give them the most specfic type as well.
  195. lexToken :: ParseM Lexeme
  196. lexToken = do
  197. inp <- getLexerState
  198. case alexScan inp (start_code inp) of
  199. AlexEOF -> alexEOF
  200. AlexError _inp' -> lexError "lexical error"
  201. AlexSkip inp' _len -> do
  202. setLexerState inp'
  203. lexToken
  204. AlexToken inp' len action -> do
  205. setLexerState inp'
  206. action inp len
  207. begin :: Int -> LexerState -> Int -> ParseM Lexeme
  208. begin code input len = do setLexerStateStartCode code; lexToken
  209. andBegin :: (LexerState -> Int -> ParseM Lexeme)
  210. -> Int -> LexerState -> Int -> ParseM Lexeme
  211. andBegin action code input len = do
  212. setLexerStateStartCode code
  213. action input len
  214. skip :: LexerState -> Int -> ParseM Lexeme
  215. skip _input _len = lexToken
  216. }