{-# OPTIONS -Wall #-}
{-# LANGUAGE TemplateHaskell #-}
module Raylib.Util.Lenses where
import Raylib.Internal.TH (genLenses)
import qualified Raylib.Types as RL
$( genLenses
     [ 
       
       ''RL.Vector2,
       ''RL.Vector3,
       ''RL.Vector4,
       ''RL.Matrix,
       ''RL.Color,
       ''RL.Rectangle,
       ''RL.VrDeviceInfo,
       ''RL.VrStereoConfig,
       ''RL.FilePathList,
       ''RL.AutomationEvent,
       ''RL.AutomationEventList,
       
       ''RL.Wave,
       ''RL.RAudioBuffer,
       ''RL.RAudioProcessor,
       ''RL.AudioStream,
       ''RL.Sound,
       ''RL.Music,
       
       ''RL.Camera3D,
       ''RL.Camera2D,
       
       ''RL.Mesh,
       ''RL.Shader,
       ''RL.MaterialMap,
       ''RL.Material,
       ''RL.Transform,
       ''RL.BoneInfo,
       ''RL.Model,
       ''RL.ModelAnimation,
       ''RL.Ray,
       ''RL.RayCollision,
       ''RL.BoundingBox,
       
       ''RL.GlyphInfo,
       ''RL.Font,
       
       ''RL.Image,
       ''RL.Texture,
       ''RL.RenderTexture,
       ''RL.NPatchInfo,
       
       ''RL.RLVertexBuffer,
       ''RL.RLDrawCall,
       ''RL.RLRenderBatch,
       
       ''RL.GuiStyleProp
     ]
 )