module GF.Command.Messages where

import GF.Infra.BuildInfo(buildInfo)
import Data.Version(showVersion)
import Paths_gf(version)


welcome :: String
welcome = [String] -> String
unlines [
  String
"                              ",
  String
"         *  *  *              ",
  String
"      *           *           ",
  String
"    *               *         ",
  String
"   *                          ",
  String
"   *                          ",
  String
"   *        * * * * * *       ",
  String
"   *        *         *       ",
  String
"    *       * * * *  *        ",
  String
"      *     *      *          ",
  String
"         *  *  *              ",
  String
"                              ",
  String
"This is GF version "String -> String -> String
forall a. [a] -> [a] -> [a]
++Version -> String
showVersion Version
versionString -> String -> String
forall a. [a] -> [a] -> [a]
++String
". ",
  String
buildInfo,
  String
"License: see help -license.   "--,
  -- Google Code is shutting down August 2015
--"Bug reports: http://code.google.com/p/grammatical-framework/issues/list"
  ]

licenseMsg :: String
licenseMsg = [String] -> String
unlines [
 String
"Copyright (c)", 
 String
"Krasimir Angelov, Bj\246rn Bringert, H\229kan Burden, Hans-Joachim Daniels,",
 String
"Ramona Enache, Markus Forsberg, Thomas Hallgren, Harald Hammarstr\246m,",
 String
"Kristofer Johannisson, Janna Khegai, Peter Ljungl\246f, Petri M\228enp\228\228, and", 
 String
"Aarne Ranta, 1998-2010.",
 String
"",
 String
"The compiler is under GNU General Public License (GPL)",
 String
"while all Haskell and most GF libraries that come with the distribution are",
 String
"under dual GNU Lesser General Public License (LGPL) and BSD License,",
 String
"see LICENSE in the GF source distribution for details."
 ]

codingMsg :: String
codingMsg = [String] -> String
unlines [
  String
"The GF shell uses Unicode internally, but assumes user input to be UTF8",
  String
"and converts terminal and file output to UTF8. If your terminal is not UTF8", 
  String
"see 'help set_encoding."
 ]

changesMsg :: String
changesMsg = [String] -> String
unlines [
  String
"While GF 3.0 is backward compatible with source grammars, the shell commands", 
  String
"have changed from version 2.9. Below the most importand changes. Bug reports",
  String
"and feature requests should be sent to http://trac.haskell.org/gf/.",
  String
"",
  String
"af     use wf -append",
  String
"at     not supported",
  String
"eh     not yet supported", 
  String
"es     no longer supported; use javascript generation",
  String
"g      not yet supported", 
  String
"l      now by default multilingual",
  String
"ml     not yet supported", 
  String
"p      now by default multilingual",
  String
"pi     not yet supported", 
  String
"pl     not yet supported", 
  String
"pm     subsumed to pg",
  String
"po     not yet supported",
  String
"pt     not yet supported", 
  String
"r      not yet supported",
  String
"rf     changed syntax",
  String
"rl     not supported",
  String
"s      no longer needed",
  String
"sa     not supported",
  String
"sf     not supported",
  String
"si     not supported",
  String
"so     not yet supported", 
  String
"t      use pipe with l and p",
  String
"tb     use l -treebank",
  String
"tl     not yet supported", 
  String
"tq     changed syntax",
  String
"ts     not supported",
  String
"tt     use ps",
  String
"ut     not supported",
  String
"vg     not yet supported",
  String
"wf     changed syntax",
  String
"wt     not supported"
  ]