[Haddock docs update for 0.8 release.
alistair@abayley.org**20080304162829] {
hunk ./doc/html/Control-Exception-MonadIO.html 22
->Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.
:: m a -> ( :: m a -> ( :: ( :: ( -> -> ( ( m => m b -> m ( m => m b -> m ( m => ( m => ( -> -> b) -> m b1 -> m ( b) -> m b1 -> m ( version 0.8 version 0.7Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. :: ( :: ( mark sess a) -> mark sess a) -> :: ( :: ( mark sess a) -> mark sess a) -> :: ( :: ( s ( s ( s s mark s mark s inquire :: EnvInquiry key s result => key -> DBM mark s result formatDBException :: DBException -> String -> m () -> m aformatDBException :: DBException -> reportRethrowMsg :: CaughtMonadIO m => -> DBException -> m a m => m => m => m => :: ( :: ( :: ( :: ( seedType = seedType = q sess b => q -> q sess b => q -> mark s mark s :: ( :: ( :: :: :: :: :: :: You may have noticed that For You may have noticed that for If we assume the existence of the following PostgreSQL function
- (this function is used in the test suite in If we assume the existence of the following PostgreSQL function,
+ which is used in the test suite in ):
+>:
hunk ./doc/html/Database-Enumerator.html 1885
-> sess, ??? a sess) => sess, ??? a sess) => Functor (DBM mark sess a) (ISession sess, ??? a sess) => sess, ??? a sess) => sess, ??? a sess) => MonadFix (DBM mark sess a) (ISession sess, ??? a sess) => :: ( :: ( mark sess a) -> mark sess a) -> :: ( :: ( mark sess a) -> mark sess a) -> :: ( :: ( s ( s ( s s mark s mark s inquire :: EnvInquiry key s result => key -> DBM mark s resultAllows arbitrary actions to be run the DBM monad.
+ the back-end developer must supply instances of EnvInquiry,
+ which is hidden away in Database.InternalEnumerator .
+ An example of this is LastInsertRowid .
+ formatDBException :: DBException -> String A show for DBException s.
+ -> m () -> m aformatDBException :: DBException -> reportRethrowMsg :: CaughtMonadIO m => -> DBException -> m aSame as reportRethrow, but you can prefix some text to the error
+ (perhaps to indicate which part of your program raised it).
+ m => m => m => m => :: ( :: ( :: ( :: ( [bindP string , bindP (0::Int), ...][bindP "string", bindP (0::Int), ...] seedType = seedType = q sess b => q -> q sess b => q -> mark s mark s :: ( :: ( :: :: :: :: :: :: version 0.8 version 0.7
-
-Database.InternalEnumerator Database.InternalEnumerator Portability non-portable Stability experimental Maintainer oleg@pobox.com, alistair@abayley.org
Description This is the interface between the middle Enumerator layer and the
- low-level, Database-specific layer. This file is not exported to the end user.
-
Only the programmer for a new back-end needs to consult this file.
-
Synopsis Session object.
- class ISession sess where The ISession class describes a database session to a particular
- DBMS. Oracle has its own Session object, SQLite has its own
- session object (which maintains the connection handle to the database
- engine and other related stuff). Session objects for different databases
- normally have different types -- yet they all belong to the class ISession
- so we can do generic operations like commit , execDDL , etc.
- in a database-independent manner.
-
Session objects per se are created by database connection/login functions.
-
The class ISession is thus an interface between low-level (and
- database-specific) code and the Enumerator, database-independent
- code.
- The ISession class is NOT visible to the end user -- neither the class,
- nor any of its methods.
-
Methods disconnect :: sess -> IO ()beginTransaction :: sess -> IsolationLevel -> IO ()commit :: sess -> IO ()rollback :: sess -> IO ()
Instances
newtype ConnectA sessA wrapper around the action to open the database. That wrapper is not
- exported to the end user. The only reason for the wrapper is to
- guarantee that the only thing to do with the result of
- connect function is to pass it out
- directly to withSession .
- Constructors
class ISession sess => Statement stmt sess q | stmt sess -> q where Statement defines the API for query objects i.e.
- which types can be queries.
-Methods makeQuery :: sess -> stmt -> IO q
Instances
class ISession sess => Command stmt sess where Command is not a query: command deletes or updates rows, creates/drops
- tables, or changes database state.
- executeCommand returns the number of affected rows (or 0 if DDL i.e. not DML).
-Methods executeCommand :: sess -> stmt -> IO Int
Instances
newtype PreparationA sess stmtThis type is not visible to the end user (cf. ConnectA). It forms a private
- `communication channel' between Database.Enumerator and a back end.
-
Why don't we make a user-visible class with a prepare method?
- Because it means to standardize the preparation method signature
- across all databases. Some databases need more parameters, some
- fewer. There may be several statement preparation functions within one
- database. So, instead of standardizing the signature of the
- preparation function, we standardize on the _result_ of that
- function. To be more precise, we standardize on the properties of the
- result: whatever it is, the eventual prepared statement should be
- suitable to be passed to bindRun .
-
Constructors PreparationA (sess -> IO stmt)
class ISession sess => IPrepared stmt sess bound_stmt bo | stmt -> bound_stmt, stmt -> bo where Methods bindRun :: sess -> stmt -> [BindA sess stmt bo] -> (bound_stmt -> IO a) -> IO adestroyStmt :: sess -> stmt -> IO ()
Instances
newtype BindA sess stmt boThe binding object (bo) below is very abstract, on purpose.
- It may be |IO a|, it may be String, it may be a function, etc.
- The binding object can hold the result of marshalling,
- or bo can hold the current counter, etc.
- Different databases do things very differently:
- compare PostgreSQL and the Stub (which models Oracle).
- Constructors BindA (sess -> stmt -> bo)
class ISession sess => DBBind a sess stmt bo | stmt -> bo where The class DBBind is not used by the end-user.
- It is used to tie up low-level database access and the enumerator.
- A database-specific library must provide a set of instances for DBBind.
- The latter are the dual of DBType.
- Methods bindP :: a -> BindA sess stmt boThis is really just a wrapper that lets us write lists of
- heterogenous bind values e.g. [bindP string , bindP (0::Int), ...]
-
Instances
data IsolationLevel Constructors ReadUncommitted ReadCommitted RepeatableRead Serialisable Serializable for alternative spellers
-
Instances
type Position = Int class ISession sess => IQuery q sess b | q -> sess, q -> b where The class IQuery describes the class of query objects. Each
- database (that is, each Session object) has its own Query object.
- We may assume that a Query object includes (at least, conceptually)
- a (pointer to) a Session object, so a Query object determines the
- Session object.
- A back-end provides an instance (or instances) of IQuery.
- The end user never seens the IQuery class (let alone its methods).
-
Can a session have several types of query objects?
- Let's assume that it can: but a statement plus the session uniquely
- determine the query,
-
Note that we explicitly use IO monad because we will have to explicitly
- do FFI.
-
Methods fetchOneRow :: q -> IO Bool currentRowNum :: q -> IO Int freeBuffer :: q -> b -> IO ()destroyQuery :: q -> IO ()
Instances
class DBType a q b | q -> b where A 'buffer' means a column buffer: a data structure that points to a
- block of memory allocated for the values of one particular
- column. Since a query normally fetches a row of several columns, we
- typically deal with a list of column buffers. Although the column data
- are typed (e.g., Integer, CalendarDate, etc), column buffers hide that
- type. Think of the column buffer as Dynamics. The class DBType below
- describes marshalling functions, to fetch a typed value out of the
- 'untyped' columnBuffer.
-
Different DBMS's (that is, different session objects) have, in
- general, columnBuffers of different types: the type of Column Buffer
- is specific to a database.
- So, ISession (m) uniquely determines the buffer type (b)??
- Or, actually, a query uniquely determines the buffer.
-
The class DBType is not used by the end-user.
- It is used to tie up low-level database access and the enumerator.
- A database-specific library must provide a set of instances for DBType.
-
Methods allocBufferFor :: a -> q -> Position -> IO bfetchCol :: q -> b -> IO a
Instances
throwIfDBNull :: Monad m => m (RowNum , ColNum ) -> m (Maybe a) -> m aUsed by instances of DBType to throw an exception
- when a null (Nothing) is returned.
- Will work for any type, as you pass the fetch action in the fetcher arg.
- Exceptions and handlers
- data DBException Constructors DBError SqlState Int String DBMS error message.
- DBFatal SqlState Int String DBUnexpectedNull RowNum ColNum the iteratee function used for queries accepts both nullable (Maybe) and
- non-nullable types. If the query itself returns a null in a column where a
- non-nullable type was specified, we can't handle it, so DBUnexpectedNull is thrown.
- DBNoData Thrown by cursor functions if you try to fetch after the end.
-
Instances
throwDB :: DBException -> aThrow a DBException. It's just a type-specific throwDyn .
- type ColNum = Int type RowNum = Int type SqlState = (SqlStateClass , SqlStateSubClass )type SqlStateClass = String type SqlStateSubClass = String Produced by Haddock version 0.8
rmfile ./doc/html/Database-InternalEnumerator.html
hunk ./doc/html/Database-Oracle-Enumerator.html 22
->Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. :: :: -> -> -> -> :: :: :: :: :: :: :: :: :: :: :: :: -> -> :: :: = = Typeable Session ( ( ( ( ( ( ( ( ( ( ( ( UTCTime) UTCTime ) ( ( ( ( ( ( ( ( ( ( ( ( UTCTime)) UTCTime )) ( ( ( ( :: :: -> -> -> -> :: :: :: :: :: :: :: :: :: :: :: :: -> -> :: :: = = ( ( ( ( ( ( ( ( ( ( UTCTime)) UTCTime )) ( ( ( ( version 0.8 version 0.7Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: :: version 0.8 version 0.7Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.Contents Foreign OCI functions
- OCI error reporting
- Allocating Handles (i.e. creating OCI data structures, and memory management)
- Connecting and detaching
- Transactions
- Issuing queries
- = = = = = = = = = ( = ( , , , , = = = = = = = = = = = = = = = = = = = = = = , , , , :: :: -> -> a) -> a) -> :: :: -> -> :: :: -> -> :: :: -> -> :: :: -> -> :: :: -> -> :: :: -> -> -> -> a -> a -> a -> a -> a -> a -> a -> a -> -> -> ( ( a) -> a) -> -> -> -> -> -> -> -> -> a -> a -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> :: :: -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> Ptr -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> ( ( ) -> ) -> -> -> ( ( -> -> ( ( -> -> -> -> -> -> -> -> -> -> ( ( , , -> -> -> -> ( ( , , :: :: -> -> :: :: -> -> -> -> :: :: -> -> -> -> -> -> ( ( , , -> -> -> -> ( ( , , -> -> ( ( , , -> -> ( ( , , :: :: -> -> -> a -> -> a -> :: :: a => a => -> -> -> -> a -> a -> :: :: :: :: -> -> :: :: -> -> -> -> -> -> a -> a -> -> -> -> -> -> -> -> -> -> -> :: :: -> -> -> -> -> -> -> -> -> -> :: :: -> -> -> -> -> -> -> -> :: :: -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> :: :: -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> :: :: -> -> a -> a -> a -> a -> ( ( :: :: :: :: -> -> :: :: -> -> :: :: -> -> :: :: -> -> -> -> -> -> ( ( :: :: -> -> -> -> :: :: -> -> :: :: -> -> :: :: -> -> :: :: -> -> ( ( :: :: -> -> ( ( UTCTime) UTCTime ) -> -> -> -> -> -> -> -> -> -> -> UTCTime -> -> UTCTime -> :: :: -> -> :: :: a => a => -> -> ( ( :: :: -> -> ( ( :: :: -> -> ( ( :: :: -> -> ( ( :: :: -> -> ( ( -> -> = = = = = = = = = ( = ( , , , , = = = = = = = = = = = = = = = = = = = = = = , , , , :: :: -> -> a) -> a) -> :: :: -> -> :: :: -> -> :: :: -> -> :: :: -> -> :: :: -> -> Foreign OCI functions
- :: :: -> -> -> -> a -> a -> a -> a -> a -> a -> a -> a -> -> -> ( ( a) -> a) -> -> -> -> -> -> -> -> -> a -> a -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> :: :: -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> Ptr -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> ( ( ) -> ) -> -> -> ( ( -> -> ( ( OCI error reporting
- -> -> -> -> -> -> -> -> -> -> ( ( , , -> -> -> -> ( ( , , :: :: -> -> :: :: -> -> -> -> :: :: -> -> -> -> -> -> ( ( , , -> -> -> -> ( ( , , -> -> ( ( , , -> -> ( ( , , :: :: -> -> -> a -> -> a -> :: :: a => a => -> -> -> -> a -> a -> Allocating Handles (i.e. creating OCI data structures, and memory management)
- :: :: :: :: -> -> :: :: -> -> -> -> -> -> a -> a -> -> -> -> -> -> -> -> -> -> -> :: :: -> -> -> -> -> -> -> -> -> -> Connecting and detaching
- :: :: -> -> -> -> -> -> -> -> :: :: -> -> -> -> -> -> -> -> -> -> -> -> -> -> Transactions
- -> -> -> -> -> -> -> -> Issuing queries
- -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> :: :: -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> :: :: -> -> a -> a -> a -> a -> ( ( :: :: :: :: -> -> :: :: -> -> :: :: -> -> :: :: -> -> -> -> -> -> ( ( :: :: -> -> -> ->
+1999 -> 119, 199
+ +0100 -> 101, 100
+ +0001 -> 100, 101
+ -0001 -> 100, 99
+ -0100 -> 99, 100
+ -1999 -> 81, 1
+
:: :: -> -> :: :: -> -> :: :: -> -> :: :: -> -> ( ( :: :: -> -> ( ( UTCTime) UTCTime ) -> -> -> -> -> -> -> -> -> -> -> UTCTime -> -> UTCTime -> :: :: -> -> :: :: a => a => -> -> ( ( :: :: -> -> ( ( :: :: -> -> ( ( :: :: -> -> ( ( :: :: -> -> ( ( -> -> version 0.8 version 0.7
-
-Database.Oracle.Test.Enumerator Database.Oracle.Test.Enumerator Portability non-portable Stability experimental Maintainer oleg@pobox.com, alistair@abayley.org
Description Documentation runTest :: ShouldRunTests -> [String ] -> IO ()Produced by Haddock version 0.8
rmfile ./doc/html/Database-Oracle-Test-Enumerator.html
hunk ./doc/html/Database-Oracle-Test-OCIFunctions.html 1
-
-
-Database.Oracle.Test.OCIFunctions
rmfile ./doc/html/Database-Oracle-Test-OCIFunctions.html
hunk ./doc/html/Database-PostgreSQL-Enumerator.html 22
->Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. :: :: :: :: -> -> :: :: :: :: -> -> :: :: :: :: :: :: :: :: -> -> :: :: Typeable Session ( ( ( ( ( ( ( ( ( ( ( ( ( ( UTCTime) UTCTime ) ( ( :: :: :: :: -> -> :: :: :: :: -> -> :: :: :: :: :: :: :: :: -> -> :: :: version 0.8 version 0.7Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. = = = = = = = = = = :: :: -> -> a) -> a) -> :: :: a => a -> a => a -> :: :: -> -> :: :: -> -> :: :: -> -> -> -> -> -> -> -> = = -> -> -> -> -> -> -> -> = = -> -> = = () -> () -> -> -> -> -> ( ( -> -> ( ( -> -> -> -> () -> () -> ( ( -> -> -> -> () -> () -> ( ( -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> = = -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> ( ( -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> = = -> -> type LOAccessType = CInt type WhenceType = CInt flo_creat :: DBHandle -> LOAccessType -> IO Oid flo_import :: DBHandle -> CString -> IO Oid flo_export :: DBHandle -> Oid -> CString -> IO CInt flo_open :: DBHandle -> Oid -> LOAccessType -> IO CInt flo_write :: DBHandle -> CInt -> Ptr Word8 -> CUInt -> IO CInt flo_read :: DBHandle -> CInt -> Ptr Word8 -> CUInt -> IO CInt flo_lseek :: DBHandle -> CInt -> CInt -> WhenceType -> IO CInt flo_tell :: DBHandle -> CInt -> IO CInt flo_close :: DBHandle -> CInt -> IO CInt flo_unlink :: DBHandle -> Oid -> IO CInt -> -> :: :: -> -> -> -> :: a -> :: a -> ( ( :: :: -> -> :: a -> :: a -> :: :: :: ( :: ( ( ( :: :: -> -> :: :: -> -> :: :: -> -> -> -> -> -> -> -> ] -> ] -> -> -> -> -> ( ( , , -> -> ] -> ] -> ( ( , , -> -> ] -> ] -> ( ( , , -> -> ] -> ] -> , , -> -> -> -> , , -> -> -> -> , , -> -> -> -> , , -> -> ] -> ] -> , , -> -> ] -> ] -> -> -> , , -> -> -> -> ] -> ] -> , , -> -> -> -> -> -> -> -> ( ( -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> UTCTime UTCTime -> -> -> -> -> -> -> -> -> -> -> -> :: :: -> -> -> -> -> -> -> -> :: :: -> -> -> -> -> -> = = = = = = = = = = :: :: -> -> a) -> a) -> :: :: a => a -> a => a -> :: :: -> -> :: :: -> -> :: :: -> -> -> -> -> -> -> -> = = -> -> -> -> -> -> -> -> = = -> -> = = () -> () -> -> -> -> -> ( ( -> -> ( ( -> -> -> -> () -> () -> ( ( -> -> -> -> () -> () -> ( ( -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> = = -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> ( ( -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> = = -> -> type LOAccessType = CInt type WhenceType = CInt flo_creat :: DBHandle -> LOAccessType -> IO Oid flo_import :: DBHandle -> CString -> IO Oid flo_export :: DBHandle -> Oid -> CString -> IO CInt flo_open :: DBHandle -> Oid -> LOAccessType -> IO CInt flo_write :: DBHandle -> CInt -> Ptr Word8 -> CUInt -> IO CInt flo_read :: DBHandle -> CInt -> Ptr Word8 -> CUInt -> IO CInt flo_lseek :: DBHandle -> CInt -> CInt -> WhenceType -> IO CInt flo_tell :: DBHandle -> CInt -> IO CInt flo_close :: DBHandle -> CInt -> IO CInt flo_unlink :: DBHandle -> Oid -> IO CInt -> -> :: :: -> -> -> -> :: a -> :: a -> ( ( :: :: -> -> :: a -> :: a -> UTCTime UTCTime ( ( :: :: :: ( :: ( ( ( :: :: -> -> :: :: -> -> :: :: -> -> -> -> -> -> -> -> ] -> ] -> -> -> -> -> ( ( , , -> -> ] -> ] -> ( ( , , -> -> ] -> ] -> ( ( , , -> -> ] -> ] -> , , -> -> -> -> , , -> -> -> -> , , -> -> -> -> , , -> -> ] -> ] -> , , -> -> ] -> ] -> -> -> , , -> -> -> -> ] -> ] -> , , -> -> -> -> -> -> -> -> ( ( -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> UTCTime UTCTime -> -> -> -> -> -> -> -> -> -> -> -> :: :: -> -> -> -> -> -> -> -> :: :: -> -> -> -> -> -> version 0.8 version 0.7
-
-Database.PostgreSQL.Test.Enumerator Database.PostgreSQL.Test.Enumerator Portability non-portable Stability experimental Maintainer oleg@pobox.com, alistair@abayley.org
Description Documentation runTest :: ShouldRunTests -> [String ] -> IO ()Produced by Haddock version 0.8
rmfile ./doc/html/Database-PostgreSQL-Test-Enumerator.html
hunk ./doc/html/Database-PostgreSQL-Test-PGFunctions.html 1
-
-
-Database.PostgreSQL.Test.PGFunctions Database.PostgreSQL.Test.PGFunctions Portability non-portable Stability experimental Maintainer oleg@pobox.com, alistair@abayley.org
Description Documentation runTest :: String -> IO ()Produced by Haddock version 0.8
rmfile ./doc/html/Database-PostgreSQL-Test-PGFunctions.html
hunk ./doc/html/Database-Sqlite-Enumerator.html 22
->Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.Typeable Session EnvInquiry LastInsertRowid Session Int64 ( ( ( ( ( ( ( ( ( ( ( ( ( ( UTCTime) UTCTime ) ( ( :: :: :: :: :: :: :: :: :: :: :: :: -> -> :: :: data LastInsertRowid Constructors Instances
version 0.8 version 0.7Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. = = = = = = a = a = ( ( a -> a -> -> -> -> -> -> -> = = ( ( -> -> :: :: -> -> a) -> a) -> :: :: :: :: :: :: :: :: :: :: -> -> :: :: -> -> = = = = -> -> -> -> -> -> -> -> -> -> -> -> -> -> a -> a -> a -> a -> -> -> IO CInt sqliteColumnCount :: StmtHandle -> -> -> -> -> -> -> -> -> sqliteLastInsertRowid :: DBHandle -> IO CLLong :: :: a -> a -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> :: :: -> -> -> -> -> -> a -> a -> -> -> -> a -> -> a -> :: :: -> -> -> -> a -> a -> :: :: -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> IO () checkColumnRange :: StmtHandle -> Int -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> ( ( -> -> -> -> ( ( -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> = = = = = = a = a = ( ( a -> a -> -> -> -> -> -> -> = = ( ( -> -> :: :: -> -> a) -> a) -> :: :: :: :: :: :: :: :: :: :: -> -> :: :: -> -> = = = = -> -> -> -> -> -> -> -> -> -> -> -> -> -> a -> a -> a -> a -> -> -> IO CInt sqliteColumnCount :: StmtHandle -> -> -> -> -> -> -> -> -> sqliteLastInsertRowid :: DBHandle -> IO CLLong :: :: a -> a -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> :: :: -> -> -> -> -> -> a -> a -> -> -> -> a -> -> a -> :: :: -> -> -> -> a -> a -> :: :: -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> IO () checkColumnRange :: StmtHandle -> Int -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> ( ( -> -> -> -> ( ( -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> -> version 0.8 version 0.7
-
-Database.Sqlite.Test.Enumerator Database.Sqlite.Test.Enumerator Portability non-portable Stability experimental Maintainer oleg@pobox.com, alistair@abayley.org
Description Documentation runTest :: ShouldRunTests -> [String ] -> IO ()Produced by Haddock version 0.8
rmfile ./doc/html/Database-Sqlite-Test-Enumerator.html
hunk ./doc/html/Database-Sqlite-Test-SqliteFunctions.html 1
-
-
-Database.Sqlite.Test.SqliteFunctions Database.Sqlite.Test.SqliteFunctions Portability non-portable Stability experimental Maintainer oleg@pobox.com, alistair@abayley.org
Description Documentation runTest :: String -> IO ()Produced by Haddock version 0.8
rmfile ./doc/html/Database-Sqlite-Test-SqliteFunctions.html
hunk ./doc/html/Database-Stub-Enumerator.html 22
->Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. :: :: :: :: :: :: -> -> :: :: :: :: :: :: :: :: -> -> :: :: version 0.8 version 0.7
-
-Database.Stub.Test.Enumerator Database.Stub.Test.Enumerator Portability non-portable Stability experimental Maintainer oleg@pobox.com, alistair@abayley.org
Description Simple test harness for Stub.
- Stub can't share the tests for "real" backends because it
- returns a somewhat contrived result set.
- Documentation runTest :: a -> [String ] -> IO ()Produced by Haddock version 0.8
rmfile ./doc/html/Database-Stub-Test-Enumerator.html
hunk ./doc/html/Database-Test-Enumerator.html 1
-
-
-Database.Test.Enumerator Database.Test.Enumerator Portability non-portable Stability experimental Maintainer oleg@pobox.com, alistair@abayley.org
Description Simple test harness. Demonstrates possible usage.
- Documentation class DBLiteralValue a where Methods Instances
data SqliteFunctions Constructors Instances
data OracleFunctions Constructors Instances
data PGSqlFunctions Constructors Instances
dateSqlite :: Int64 -> String dateOracle :: Int64 -> String datePG :: Int64 -> String expectFloatsAndInts :: [(Double , Int )]iterNullString :: Monad m => String -> String -> Maybe String -> IterAct m [(String , String , Maybe String )]iterEmptyString :: Monad m => String -> String -> Maybe String -> IterAct m [(String , String , Maybe String )]iterUnhandledNull :: Monad m => String -> String -> UTCTime -> IterAct m [(String , String , UTCTime)]iterNullDate :: Monad m => String -> String -> Maybe UTCTime -> IterAct m [(String , String , UTCTime)]iterDate :: Monad m => UTCTime -> IterAct m [UTCTime]iterCalDate :: Monad m => CalendarTime -> IterAct m [CalendarTime ]iterBoundaryDates :: Monad m => UTCTime -> IterAct m [UTCTime]iterCursor :: Monad m => Int -> IterAct m [Int ]iterBindString :: Monad m => String -> IterAct m [String ]iterBindInt :: Monad m => Int -> IterAct m [Int ]expectBindInt :: [Int ]iterBindIntDoubleString :: Monad m => Int -> Double -> String -> IterAct m [(Int , Double , String )]expectBindIntDoubleString :: [(Int , Double , String )]iterBindDate :: Monad m => UTCTime -> IterAct m [UTCTime]data MyTree aConstructors Instances
iterPolymorphicFetch :: Monad m => MyTree String -> IterAct m (MyTree String )iterPolymorphicFetchNull :: Monad m => Maybe (MyTree String ) -> IterAct m (Maybe (MyTree String ))expectPolymorphicFetchNull :: Maybe (MyTree String )expectRebind1 :: [Int ]expectRebind2 :: [Int ]Produced by Haddock version 0.8
rmfile ./doc/html/Database-Test-Enumerator.html
hunk ./doc/html/Database-Test-MultiConnect.html 1
-
-
-Database.Test.MultiConnect Database.Test.MultiConnect Portability non-portable Stability experimental Maintainer oleg@pobox.com, alistair@abayley.org
Description Tests Database.Enumerator code in the context of multiple
- database connections to different DBMS products.
- We should add tests to shift data between databases, too.
- Documentation runTest :: ShouldRunTests -> [String ] -> IO ()Produced by Haddock version 0.8
rmfile ./doc/html/Database-Test-MultiConnect.html
hunk ./doc/html/Database-Test-Performance.html 1
-
-
-Database.Test.Performance Database.Test.Performance Portability non-portable Stability experimental Maintainer oleg@pobox.com, alistair@abayley.org
Description Performance tests. Currently just tests large result sets.
- Synopsis Documentation data ShouldRunTests Constructors Instances
rowCounter :: Monad m => Int -> Int -> IterAct m Int This counter takes the maximum number of rows to fetch as its first argument,
- so don't forget to curry it when using it as an iteratee function.
- We also try to ensure that it is strict in the counter;
- we don't want thousands or millions of unevaluated + thunks sitting
- on the stack.
- sqlRows2Power17 :: String sqlRows2Power20 :: String Produced by Haddock version 0.8
rmfile ./doc/html/Database-Test-Performance.html
hunk ./doc/html/Database-Util.html 22
->Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. :: a -> :: a -> :: ( :: ( :: ( :: ( a, a, b) => a -> a -> a -> a -> a -> b -> UTCTime b) => a -> a -> a -> a -> a -> b -> UTCTime :: :: a => a -> a -> a -> a -> a -> a -> a => a -> a -> a -> a -> a -> a -> :: :: -> ( -> ( , , , , , , , , , , :: ( :: ( a1, a1, a2, a2, a3, a3, a4, a4, a5, a5, a6) => (a1, a2, a3, a4, a5, a6) -> a6) => (a1, a2, a3, a4, a5, a6) -> :: :: -> -> :: :: -> -> :: :: -> UTCTime -> UTCTime :: ( :: ( -> -> ) -> ) -> -> [ -> [ :: ( :: ( -> -> ) -> ) -> -> [ -> [ :: :: a => [a] -> [a] -> [ a => [a] -> [a] -> [ :: :: -> UTCTime -> UTCTime :: :: -> -> pgDatetimetoParts :: pgDatetimeToParts :: -> ( -> ( , , , , , , , , , , , , utcTimeToIsoString :: (Integral a, Integral b) => UTCTime -> String -> (a -> a) -> (b -> String ) -> String :: UTCTime -> :: UTCTime -> String utcTimeToIsoDatetime :: UTCTime -> String utcTimeToOdbcDatetime :: UTCTime -> :: :: -> -> :: a -> :: a -> :: ( :: ( :: ( :: ( a, a, b) => a -> a -> a -> a -> a -> b -> UTCTime b) => a -> a -> a -> a -> a -> b -> UTCTime :: :: a => a -> a -> a -> a -> a -> a -> a => a -> a -> a -> a -> a -> a -> :: :: -> ( -> ( , , , , , , , , , , :: ( :: ( a1, a1, a2, a2, a3, a3, a4, a4, a5, a5, a6) => (a1, a2, a3, a4, a5, a6) -> a6) => (a1, a2, a3, a4, a5, a6) -> :: :: -> -> :: :: -> -> :: :: -> UTCTime -> UTCTime :: ( :: ( -> -> ) -> ) -> -> [ -> [ :: ( :: ( -> -> ) -> ) -> -> [ -> [ :: :: a => [a] -> [a] -> [ a => [a] -> [a] -> [ :: :: -> UTCTime -> UTCTime :: :: -> -> pgDatetimetoParts :: pgDatetimeToParts :: -> ( -> ( , , , , , , , , , , , , utcTimeToIsoString :: (Integral a, Integral b) => UTCTime -> String -> (a -> a) -> (b -> String ) -> String :: UTCTime -> :: UTCTime -> String utcTimeToIsoDatetime :: UTCTime -> String utcTimeToOdbcDatetime :: UTCTime -> :: :: -> -> version 0.8 version 0.7
-
-Main Main Portability non-portable Stability experimental Maintainer oleg@pobox.com, alistair@abayley.org
Description Simple driver module, mainly for testing.
- Imports test modules and runs test suites.
-
This project is now hosted at haskell.org:
-
darcs get http://darcs.haskell.org/takusen Invoke main like this (assuming the compiled executable is called takusen ):
-
takusen stub noperf
- takusen sqlite noperf "" "" dbname
- takusen oracle noperf "" "" dbname -- no username, so os-authenticated
- takusen mssql noperf user paswd dbname
- Documentation main :: IO ()Produced by Haddock version 0.8
rmfile ./doc/html/Main.html
hunk ./doc/html/Test-MiniUnit.html 1
-
-
-Test.MiniUnit
rmfile ./doc/html/Test-MiniUnit.html
hunk ./doc/html/Test-MiniUnitTest.html 1
-
-
-Test.MiniUnitTest Documentation main :: IO ()Produced by Haddock version 0.8
rmfile ./doc/html/Test-MiniUnitTest.html
hunk ./doc/html/doc-index-A.html 7
-> (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.assertBoolallocConnTest.MiniUnit Database.ODBC.OdbcFunctions assertEqualallocEnvTest.MiniUnit Database.ODBC.OdbcFunctions assertFailureallocHdlTest.MiniUnit Database.ODBC.OdbcFunctions assertStringallocStmtTest.MiniUnit Database.ODBC.OdbcFunctions (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.1 (Type/Class) Database.ODBC.OdbcFunctions 2 (Data Constructor) Database.ODBC.OdbcFunctions 3 (Type/Class) Branch Buffer 1 (Type/Class) Database.Test.Enumerator Database.ODBC.OdbcFunctions 2 (Data Constructor) Database.ODBC.OdbcFunctions 1 (Type/Class) Database.ODBC.OdbcFunctions 2 (Type/Class) , Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.EnumeratorbindBufPtrDatabase.ODBC.OdbcFunctions bindBufSize Database.ODBC.OdbcFunctions bindBufSzPtr Database.ODBC.OdbcFunctions bindColBuffer Database.ODBC.OdbcFunctions bindColumnBuffer Database.ODBC.OdbcFunctions bindEncodedString Database.ODBC.OdbcFunctions 1 (Function) Database.ODBC.OdbcFunctions 2 (Function) , Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.EnumeratorbindParam Database.ODBC.OdbcFunctions bindParamBuffer Database.ODBC.OdbcFunctions bindParamCAString Database.ODBC.OdbcFunctions bindParamCStringLen Database.ODBC.OdbcFunctions bindParamCWString Database.ODBC.OdbcFunctions bindParamUTF8String Database.ODBC.OdbcFunctions bindParamUtcTime Database.ODBC.OdbcFunctions (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.1 (Type/Class) Database.ODBC.OdbcFunctions 2 (Type/Class) ConnObj1 (Type/Class) Database.ODBC.OdbcFunctions 2 (Data Constructor) Database.ODBC.OdbcFunctions , Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator , Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.EnumeratorcatchOdbcDatabase.ODBC.OdbcFunctions checkColumnRange Database.Sqlite.SqliteFunctions checkError Database.ODBC.OdbcFunctions closeCursor Database.ODBC.OdbcFunctions Database.ODBC.Enumerator 2 (Function) 2 (Function) 3 (Function)3 (Function)4 (Function), Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator3 (Function) Database.ODBC.OdbcFunctions Database.ODBC.Enumerator 2 (Function) Database.ODBC.OdbcFunctions 3 (Function) 2 (Function) 4 (Function)3 (Function)5 (Function)4 (Function)6 (Function)createBufferForStorableDatabase.ODBC.OdbcFunctions createBufferHelper Database.ODBC.OdbcFunctions createEmptyBuffer Database.ODBC.OdbcFunctions , Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator , Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC., Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.EnumeratorDBLiteralValueDatabase.Test.Enumerator , Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator , Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.EnumeratorDon'tRunTestsDatabase.Test.Performance dateOracle Database.Test.Enumerator datePG Database.Test.Enumerator dateSqlite Database.Test.Enumerator 1 (Function) 2 (Function) Database.ODBC.OdbcFunctions , Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. 1 (Type/Class) Database.ODBC.OdbcFunctions 2 (Type/Class) EnvInquiry Database.InternalEnumerator EnvObj 1 (Type/Class) Database.ODBC.OdbcFunctions 2 (Data Constructor) Database.ODBC.OdbcFunctions , Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.EnumeratorexpectBindIntDatabase.Test.Enumerator expectBindIntDoubleString Database.Test.Enumerator expectFloatsAndInts Database.Test.Enumerator expectPolymorphicFetchNull Database.Test.Enumerator expectRebind1 Database.Test.Enumerator expectRebind2 executeStmtDatabase.Test.Enumerator Database.ODBC.OdbcFunctions (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.fetchDatabase.ODBC.OdbcFunctions flo_close Database.PostgreSQL.PGFunctions flo_creat Database.PostgreSQL.PGFunctions flo_export Database.PostgreSQL.PGFunctions flo_import Database.PostgreSQL.PGFunctions flo_lseek Database.PostgreSQL.PGFunctions flo_open Database.PostgreSQL.PGFunctions flo_read Database.PostgreSQL.PGFunctions flo_tell Database.PostgreSQL.PGFunctions flo_unlink Database.PostgreSQL.PGFunctions flo_write Database.PostgreSQL.PGFunctions , Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator , Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.EnumeratorfreeConn Database.ODBC.OdbcFunctions freeEnv Database.ODBC.OdbcFunctions freeHelper Database.ODBC.OdbcFunctions freeStmt Database.ODBC.OdbcFunctions (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.getCAStringFromBuffer Database.ODBC.OdbcFunctions getCWStringFromBuffer Database.ODBC.OdbcFunctions getData Database.ODBC.OdbcFunctions getDataCString Database.ODBC.OdbcFunctions getDataCStringLen Database.ODBC.OdbcFunctions getDataStorable Database.ODBC.OdbcFunctions getDataUTF8String Database.ODBC.OdbcFunctions getDataUtcTime Database.ODBC.OdbcFunctions getDiagRec Database.ODBC.OdbcFunctions getFromBufferDatabase.ODBC.OdbcFunctions getMaybeFromBuffer Database.ODBC.OdbcFunctions getStorableFromBuffer Database.ODBC.OdbcFunctions getUTF8StringFromBuffer Database.ODBC.OdbcFunctions getUtcTimeFromBuffer Database.ODBC.OdbcFunctions (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.Handle Database.ODBC.OdbcFunctions HandleObj 1 (Type/Class) Database.ODBC.OdbcFunctions 2 (Data Constructor) Database.ODBC.OdbcFunctions (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.InOutParam 1 (Type/Class) Database.ODBC.OdbcFunctions 2 (Data Constructor) Database.ODBC.OdbcFunctions , Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator int64ToCalTime Database.Util int64ToDateParts Database.Util int64ToUTCTime Database.Util , Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.EnumeratoriterBindDate Database.Test.Enumerator inquire iterBindInt Database.Test.Enumerator iterBindIntDoubleString 1 (Function) Database.Test.Enumerator iterBindString Database.Test.Enumerator iterBoundaryDates Database.Test.Enumerator iterCalDate Database.Test.Enumerator iterCursor Database.Test.Enumerator iterDate Database.Test.Enumerator iterEmptyString Database.Test.Enumerator Database.Enumerator , Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.EnumeratoriterNullDate 2 (Function) Database.Test.Enumerator Database.InternalEnumerator iterNullStringint2PtrDatabase.Test.Enumerator Database.ODBC.OdbcFunctions iterPolymorphicFetchint64ToCalTimeDatabase.Test.Enumerator Database.Util iterPolymorphicFetchNullint64ToDatePartsDatabase.Test.Enumerator Database.Util iterUnhandledNullint64ToUTCTimeDatabase.Test.Enumerator Database.Util (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.LeafDatabase.Test.Enumerator lengthUTF8 Foreign.C.UTF8 literalDate LOAccessTypeDatabase.Test.Enumerator Database.PostgreSQL.PGFunctions literalDouble Database.Test.Enumerator LastInsertRowid literalFloat 1 (Type/Class) Database.Test.Enumerator Database.Sqlite.Enumerator literalInt 2 (Data Constructor) Database.Test.Enumerator Database.Sqlite.Enumerator literalInt64lengthUTF8Database.Test.Enumerator Foreign.C.UTF8 (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.MyShowMyCStringDatabase.Util Database.ODBC.OdbcFunctions MyTreeMyCStringLenDatabase.Test.Enumerator Database.ODBC.OdbcFunctions main 1 (Function) Main 2 (Function) MyShow Test.MiniUnitTest Database.Util makeUtcTimeBufferDatabase.ODBC.OdbcFunctions makeUtcTimeStringBuffer Database.ODBC.OdbcFunctions moreResults Database.ODBC.OdbcFunctions (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC., Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.OidOdbcBindBufferDatabase.PostgreSQL.PGFunctions Database.ODBC.OdbcFunctions OdbcBindParam Database.ODBC.OdbcFunctions OracleFunctions OdbcExceptionDatabase.Test.Enumerator Database.ODBC.OdbcFunctions Database.Test.Enumerator Database.ODBC.OdbcFunctions Oid Database.PostgreSQL.PGFunctions OutParam 1 (Type/Class) Database.ODBC.OdbcFunctions 2 (Data Constructor) Database.ODBC.OdbcFunctions (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.PGSqlFunctions 1 (Type/Class) Database.Test.Enumerator 2 (Data Constructor) Database.Test.Enumerator , Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator peekSmallInt Database.ODBC.OdbcFunctions peekUInteger Database.ODBC.OdbcFunctions peekUSmallInt Database.ODBC.OdbcFunctions pgDatetimetoCalTimepeekUTF8StringLenForeign.C.UTF8 pgDatetimeToParts pgDatetimetoParts pgDatetimetoCalTimepokeSmallInt Database.ODBC.OdbcFunctions pokeUInteger Database.ODBC.OdbcFunctions pokeUSmallInt Database.ODBC.OdbcFunctions Database.ODBC.Enumerator 2 (Function) 2 (Function) 3 (Function)3 (Function)4 (Function)4 (Function)5 (Function)Database.ODBC.Enumerator 2 (Function) 2 (Function) 3 (Function)3 (Function)4 (Function)Database.ODBC.Enumerator 2 (Function) 2 (Function) 3 (Function)3 (Function)4 (Function)Database.ODBC.Enumerator 2 (Function) 2 (Function) 3 (Function)3 (Function)4 (Function)Database.ODBC.Enumerator 2 (Function) 2 (Function) 3 (Function)3 (Function)4 (Function)Database.ODBC.Enumerator 2 (Function) Database.ODBC.OdbcFunctions 3 (Function) 2 (Function) 4 (Function)3 (Function)5 (Function) (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC., Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.EnumeratorRunTestsreadUtcTimeFromMemoryDatabase.Test.Performance Database.ODBC.OdbcFunctions reportResultsreportRethrowTest.MiniUnit Database.Enumerator , Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.EnumeratorreportRethrowreportRethrowMsg, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator rollbackTrans Database.Oracle.OCIFunctions rowCounter Database.Test.Performance runSingleTest Test.MiniUnit runTest 1 (Function) Database.Oracle.Test.Enumerator 2 (Function) Database.Oracle.Test.OCIFunctions Database.PostgreSQL.Test.Enumerator 4 (Function) Database.PostgreSQL.Test.PGFunctions Database.ODBC.OdbcFunctions 5 (Function) Database.Sqlite.Test.Enumerator 6 (Function) Database.Sqlite.Test.SqliteFunctions 7 (Function) Database.Stub.Test.Enumerator 8 (Function) Database.Test.MultiConnect 9 (Function) rollbackTrans Database.Test.Util Database.Oracle.OCIFunctions runTestTTrowCountTest.MiniUnit Database.ODBC.OdbcFunctions (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC., Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.EnumeratorDatabase.ODBC.Enumerator 2 (Type/Class) 2 (Type/Class) 3 (Type/Class)3 (Type/Class)4 (Type/Class)4 (Type/Class)5 (Type/Class)ShouldRunTestsSizeFPtrDatabase.ODBC.OdbcFunctions SqlCDataType Database.Test.Performance Database.ODBC.OdbcFunctions SqlDataType Database.ODBC.OdbcFunctions SqlHandleType Database.ODBC.OdbcFunctions SqlInteger Database.ODBC.OdbcFunctions SqlLen Database.ODBC.OdbcFunctions SqlParamDirection Database.ODBC.OdbcFunctions SqlReturn Database.ODBC.OdbcFunctions SqlSmallInt Database.ODBC.OdbcFunctions SqliteCallback SqlUIntegerDatabase.Sqlite.SqliteFunctions Database.ODBC.OdbcFunctions SqliteException SqlULen Database.ODBC.OdbcFunctions 1 (Type/Class) SqlUSmallInt Database.Sqlite.SqliteFunctions Database.ODBC.OdbcFunctions 2 (Data Constructor) SqliteCallback SqliteFunctionsSqliteException Database.Test.Enumerator Database.Sqlite.SqliteFunctions Database.Test.Enumerator Database.Sqlite.SqliteFunctions Database.ODBC.OdbcFunctions 2 (Type/Class) 2 (Type/Class) 3 (Type/Class)StmtObj1 (Type/Class) Database.ODBC.OdbcFunctions 2 (Data Constructor) Database.ODBC.OdbcFunctions setAutoCommitOff Database.ODBC.OdbcFunctions setAutoCommitOn Database.ODBC.OdbcFunctions setOdbcVer Database.ODBC.OdbcFunctions setTxnIsolation Database.ODBC.OdbcFunctions sizeOfMaybe Database.ODBC.OdbcFunctions Database.ODBC.Enumerator 2 (Function) 2 (Function) 3 (Function)3 (Function)4 (Function)4 (Function)5 (Function)sqlRows2Power17sqlAllocHandleDatabase.ODBC.OdbcFunctions sqlAutoCommitOff Database.ODBC.OdbcFunctions sqlAutoCommitOn Database.ODBC.OdbcFunctions sqlBindCol Database.ODBC.OdbcFunctions sqlBindParameter Database.ODBC.OdbcFunctions sqlCloseCursor Database.Test.Performance Database.ODBC.OdbcFunctions sqlRows2Power20sqlDisconnectDatabase.Test.Performance Database.ODBC.OdbcFunctions sqlDriverConnect Database.ODBC.OdbcFunctions sqlDriverNoPrompt Database.ODBC.OdbcFunctions sqlEndTran Database.ODBC.OdbcFunctions sqlExecute Database.ODBC.OdbcFunctions sqlFetch Database.ODBC.OdbcFunctions sqlFreeHandle Database.ODBC.OdbcFunctions sqlGetData Database.ODBC.OdbcFunctions sqlGetDiagRec Database.ODBC.OdbcFunctions sqlMoreResults Database.ODBC.OdbcFunctions sqlNullData Database.ODBC.OdbcFunctions sqlNullTermedString Database.ODBC.OdbcFunctions sqlPrepare Database.ODBC.OdbcFunctions sqlRowCount Database.ODBC.OdbcFunctions sqlSetConnectAttr Database.ODBC.OdbcFunctions sqlSetEnvAttr Database.ODBC.OdbcFunctions sqlTransCommit Database.ODBC.OdbcFunctions sqlTransRollback Database.ODBC.OdbcFunctions Database.ODBC.Enumerator 2 (Function) 2 (Function) 3 (Function)3 (Function)4 (Function)sqliteColumnCountDatabase.Sqlite.SqliteFunctions sqliteLastInsertRowid Database.Sqlite.SqliteFunctions (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index) Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.TestExceptionTest.MiniUnit TestFailure Test.MiniUnit TestResult Test.MiniUnit TestSuccess Test.MiniUnit testForNull Database.ODBC.OdbcFunctions , Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator , Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.EnumeratorthrowOdbcDatabase.ODBC.OdbcFunctions throwUserError Test.MiniUnit (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.utcTimeToPGDatetimeutcTimeToIsoDatetimeDatabase.Util utcTimeToIsoString utf8RoundTrip utcTimeToOdbcDatetimeDatabase.Test.Util Database.Util utcTimeToPGDatetime Database.Util (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index) Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.WhenceTypeDatabase.PostgreSQL.PGFunctions WindowHandle Database.ODBC.OdbcFunctions , Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator , Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.Enumerator, Database.ODBC.Enumerator, Database.Oracle.Enumerator, Database.PostgreSQL.Enumerator, Database.Sqlite.EnumeratorwrapSizedBuffer Database.ODBC.OdbcFunctions writeUTCTimeToMemory Database.ODBC.OdbcFunctions
-
- (Index)
rmfile ./doc/html/doc-index-Z.html
hunk ./doc/html/doc-index.html 7
-> (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. (Index)Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. font is a little too small in MSIE */
-TT { font-size: 100%; }
-PRE { font-size: 100%; }
-
-LI P { margin: 0pt }
-
-TD {
- border-width: 0px;
-}
-
-TABLE.narrow {
- border-width: 0px;
-}
-
-TD.s8 { height: 8px; }
-TD.s15 { height: 15px; }
-
-SPAN.keyword { text-decoration: underline; }
-
-/* Resize the buttom image to match the text size */
-IMG.coll { width : 0.75em; height: 0.75em; margin-bottom: 0; margin-right: 0.5em }
-
-/* --------- Contents page ---------- */
-
-DIV.node {
- padding-left: 3em;
-}
-
-DIV.cnode {
- padding-left: 1.75em;
-}
-
-SPAN.pkg {
- position: absolute;
- left: 50em;
-}
-
-/* --------- Documentation elements ---------- */
-
-TD.children {
- padding-left: 25px;
- }
-
-TD.synopsis {
- padding: 2px;
- background-color: #f0f0f0;
- font-family: monospace
- }
-
-TD.decl {
- padding: 2px;
- background-color: #f0f0f0;
- font-family: monospace;
- vertical-align: top;
- }
-
-/*
- arg is just like decl, except that wrapping is not allowed. It is
- used for function and constructor arguments which have a text box
- to the right, where if wrapping is allowed the text box squashes up
- the declaration by wrapping it.
-*/
-TD.arg {
- padding: 2px;
- background-color: #f0f0f0;
- font-family: monospace;
- vertical-align: top;
- white-space: nowrap;
- width: 50%
- }
-
-TD.recfield { padding-left: 20px }
-
-TD.doc {
- padding-top: 2px;
- padding-left: 10px;
- }
-
-TD.ndoc {
- padding: 2px;
- }
-
-TD.rdoc {
- padding: 2px;
- padding-left: 10px;
- width: 100%;
- }
-
-TD.body {
- padding-left: 10px
- }
-
-TD.pkg {
- width: 100%;
- padding-left: 10px
-}
-
-TD.indexentry {
- vertical-align: top;
- padding-right: 10px
- }
-
-TD.indexannot {
- vertical-align: top;
- padding-left: 20px;
- white-space: nowrap
- }
-
-TD.indexlinks {
- width: 100%
- }
-
-/* ------- Section Headings ------- */
-
-TD.section1 {
- padding-top: 15px;
- font-weight: bold;
- font-size: 150%
- }
-
-TD.section2 {
- padding-top: 10px;
- font-weight: bold;
- font-size: 130%
- }
-
-TD.section3 {
- padding-top: 5px;
- font-weight: bold;
- font-size: 110%
- }
-
-TD.section4 {
- font-weight: bold;
- font-size: 100%
- }
-
-/* -------------- The title bar at the top of the page */
-
-TD.infohead {
- color: #ffffff;
- font-weight: bold;
- padding-right: 10px;
- text-align: left;
-}
-
-TD.infoval {
- color: #ffffff;
- padding-right: 10px;
- text-align: left;
-}
-
-TD.topbar {
- background-color: #000099;
- padding: 5px;
-}
-
-TD.title {
- color: #ffffff;
- padding-left: 10px;
- width: 100%
- }
-
-TD.topbut {
- padding-left: 5px;
- padding-right: 5px;
- border-left-width: 1px;
- border-left-color: #ffffff;
- border-left-style: solid;
- white-space: nowrap;
- }
-
-TD.topbut A:link {
- color: #ffffff
- }
-
-TD.topbut A:visited {
- color: #ffff00
- }
-
-TD.topbut A:hover {
- background-color: #6060ff;
- }
-
-TD.topbut:hover {
- background-color: #6060ff
- }
-
-TD.modulebar {
- background-color: #0077dd;
- padding: 5px;
- border-top-width: 1px;
- border-top-color: #ffffff;
- border-top-style: solid;
- }
-
-/* --------- The page footer --------- */
-
-TD.botbar {
- background-color: #000099;
- color: #ffffff;
- padding: 5px
- }
-TD.botbar A:link {
- color: #ffffff;
- text-decoration: underline
- }
-TD.botbar A:visited {
- color: #ffff00
- }
-TD.botbar A:hover {
- background-color: #6060ff
- }
-
+/* -------- Global things --------- */
+
+BODY {
+ background-color: #ffffff;
+ color: #000000;
+ font-family: sans-serif;
+ }
+
+A:link { color: #0000e0; text-decoration: none }
+A:visited { color: #0000a0; text-decoration: none }
+A:hover { background-color: #e0e0ff; text-decoration: none }
+
+TABLE.vanilla {
+ width: 100%;
+ border-width: 0px;
+ /* I can't seem to specify cellspacing or cellpadding properly using CSS... */
+}
+
+TABLE.vanilla2 {
+ border-width: 0px;
+}
+
+/* font is a little too small in MSIE */
+TT { font-size: 100%; }
+PRE { font-size: 100%; }
+
+LI P { margin: 0pt }
+
+TD {
+ border-width: 0px;
+}
+
+TABLE.narrow {
+ border-width: 0px;
+}
+
+TD.s8 { height: 8px; }
+TD.s15 { height: 15px; }
+
+SPAN.keyword { text-decoration: underline; }
+
+/* Resize the buttom image to match the text size */
+IMG.coll { width : 0.75em; height: 0.75em; margin-bottom: 0; margin-right: 0.5em }
+
+/* --------- Contents page ---------- */
+
+DIV.node {
+ padding-left: 3em;
+}
+
+DIV.cnode {
+ padding-left: 1.75em;
+}
+
+SPAN.pkg {
+ position: absolute;
+ left: 50em;
+}
+
+/* --------- Documentation elements ---------- */
+
+TD.children {
+ padding-left: 25px;
+ }
+
+TD.synopsis {
+ padding: 2px;
+ background-color: #f0f0f0;
+ font-family: monospace
+ }
+
+TD.decl {
+ padding: 2px;
+ background-color: #f0f0f0;
+ font-family: monospace;
+ vertical-align: top;
+ }
+
+/*
+ arg is just like decl, except that wrapping is not allowed. It is
+ used for function and constructor arguments which have a text box
+ to the right, where if wrapping is allowed the text box squashes up
+ the declaration by wrapping it.
+*/
+TD.arg {
+ padding: 2px;
+ background-color: #f0f0f0;
+ font-family: monospace;
+ vertical-align: top;
+ white-space: nowrap;
+ }
+
+TD.recfield { padding-left: 20px }
+
+TD.doc {
+ padding-top: 2px;
+ padding-left: 10px;
+ }
+
+TD.ndoc {
+ padding: 2px;
+ }
+
+TD.rdoc {
+ padding: 2px;
+ padding-left: 10px;
+ width: 100%;
+ }
+
+TD.body {
+ padding-left: 10px
+ }
+
+TD.pkg {
+ width: 100%;
+ padding-left: 10px
+}
+
+TD.indexentry {
+ vertical-align: top;
+ padding-right: 10px
+ }
+
+TD.indexannot {
+ vertical-align: top;
+ padding-left: 20px;
+ white-space: nowrap
+ }
+
+TD.indexlinks {
+ width: 100%
+ }
+
+/* ------- Section Headings ------- */
+
+TD.section1 {
+ padding-top: 15px;
+ font-weight: bold;
+ font-size: 150%
+ }
+
+TD.section2 {
+ padding-top: 10px;
+ font-weight: bold;
+ font-size: 130%
+ }
+
+TD.section3 {
+ padding-top: 5px;
+ font-weight: bold;
+ font-size: 110%
+ }
+
+TD.section4 {
+ font-weight: bold;
+ font-size: 100%
+ }
+
+/* -------------- The title bar at the top of the page */
+
+TD.infohead {
+ color: #ffffff;
+ font-weight: bold;
+ padding-right: 10px;
+ text-align: left;
+}
+
+TD.infoval {
+ color: #ffffff;
+ padding-right: 10px;
+ text-align: left;
+}
+
+TD.topbar {
+ background-color: #000099;
+ padding: 5px;
+}
+
+TD.title {
+ color: #ffffff;
+ padding-left: 10px;
+ width: 100%
+ }
+
+TD.topbut {
+ padding-left: 5px;
+ padding-right: 5px;
+ border-left-width: 1px;
+ border-left-color: #ffffff;
+ border-left-style: solid;
+ white-space: nowrap;
+ }
+
+TD.topbut A:link {
+ color: #ffffff
+ }
+
+TD.topbut A:visited {
+ color: #ffff00
+ }
+
+TD.topbut A:hover {
+ background-color: #6060ff;
+ }
+
+TD.topbut:hover {
+ background-color: #6060ff
+ }
+
+TD.modulebar {
+ background-color: #0077dd;
+ padding: 5px;
+ border-top-width: 1px;
+ border-top-color: #ffffff;
+ border-top-style: solid;
+ }
+
+/* --------- The page footer --------- */
+
+TD.botbar {
+ background-color: #000099;
+ color: #ffffff;
+ padding: 5px
+ }
+TD.botbar A:link {
+ color: #ffffff;
+ text-decoration: underline
+ }
+TD.botbar A:visited {
+ color: #ffff00
+ }
+TD.botbar A:hover {
+ background-color: #6060ff
+ }
+
hunk ./doc/html/index.html 7
->Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC.Takusen-0.8: Database library with left-fold interface, for PostgreSQL, Oracle, SQLite, ODBC. Takusen is a DBMS access library. Like HSQL, we support
+arbitrary SQL statements (currently strings, extensible to anything
+that can be converted to a string).
+
Takusen's unique selling point is safety and efficiency.
+We statically ensure all acquired database resources - such
+as cursors, connections, and statement handles - are released, exactly
+once, at predictable times. Takusen can avoid loading the whole result
+set in memory, and so can handle queries returning millions of rows in
+constant space. Takusen also supports automatic marshalling and
+unmarshalling of results and query parameters. These benefits come
+from the design of query result processing around a left-fold
+enumerator.
+
Currently we fully support ODBC, Oracle, Sqlite, and PostgreSQL.
+
Oracle ODBCDatabase.Oracle.Enumerator Database.ODBC.Enumerator Database.Oracle.OCIConstants Database.ODBC.OdbcFunctions Database.Oracle.OCIFunctions Test OracleDatabase.Oracle.Test.Enumerator Database.Oracle.Enumerator Database.Oracle.Test.OCIFunctions Database.Oracle.OCIConstants Database.Oracle.OCIFunctions Test