Result:
found more than 658 distributions - search limited to the first 2001 files matching your query ( run in 0.521 )


Brat-Handler

 view release on metacpan or  search on metacpan

examples/taln-2012-long-003-resume.ann  view on Meta::CPAN

T1	term 4 38	méthode d'extraction d'information
T2	term 70 96	remplissage de formulaires
T3	term 54 61	graphes
T4	term 4 61	méthode d'extraction d'information fondée sur les graphes
T5	term 106 160	systèmes d’extraction d’information sur des événements
T6	term 106 141	systèmes d’extraction d’information
T7	term 190 228	remplissage automatique de formulaires
T8	term 244 273	informations sur un événement
T9	term 294 313	texte non structuré
T10	term 318 343	remplissage de formulaire
T11	term 441 463	éléments d’information
T12	term 480 489	événement
T13	term 417 422	texte
T14	term 592 613	segmentation du texte
T15	term 592 627	segmentation du texte en événements

examples/taln-2012-long-003-resume.ann  view on Meta::CPAN

T19	term 753 780	entités liées à l’événement
T20	term 786 796	évaluation
T21	term 822 847	corpus annoté de dépêches
T22	term 822 835	corpus annoté
T23	term 899 906	F-score
T24	term 931 957	remplissage de formulaires
T25	term 378 389	information
T26	term 537 545	approche

 view all matches for this distribution


Bundle-Test-SQL-Statement

 view release on metacpan or  search on metacpan

t/09ops.t  view on Meta::CPAN

sub newop {
    my ( $self, $owner, $left, $right ) = @_;
    return $left < $right;
}
__END__
"a disjunction of conjunctions of literals, where each literal is an elementary relational formula or its negation"

 view all matches for this distribution


Business-Colissimo

 view release on metacpan or  search on metacpan

lib/Business/Colissimo.pm  view on Meta::CPAN

images with the right number of pixels to include them
into PDF with L<PDF::API2>, which uses 72dpi resolution
for images unless you specify width and height explicitly
(see L<PDF::API2::Content>).

The formula for calculating width in mm for a 72dpi
resolution is as follows:

    (1px * 25.4) / 72dpi

This fits into Colissimo's requirement for the basic

 view all matches for this distribution


Business-EDI

 view release on metacpan or  search on metacpan

lib/Business/EDI/CodeList/CodeListResponsibleAgencyCode.pm  view on Meta::CPAN

'352' => [ 'US, Office of Fossil Energy (OFE)',
    'A division of the US Department of Energy.' ],
'353' => [ 'US, Office of Foreign Missions (OFM)',
    'A division of the US Department of State. OFM provides the legal foundation to facilitate secure and efficient operations of US missions abroad, and of foreign missions and international organizations in the United States.' ],
'354' => [ 'US, Bureau of Oceans and International Environmental and',
    'Scientific Affairs (OES) A division of the US Department of State. OES works with issues surrounding foreign policy formulation and implementation in global environment, science, and technology.' ],
'355' => [ 'US, Office of Naval Intelligence (ONI)',
    'A division of the US Department of Defense (Navy).' ],
'356' => [ 'US, Pipeline and Hazardous Materials Safety Administration',
    "(PHMSA) A division of the US Department of Transportation. PHMSA works to protect the American public and the environment by ensuring the safe and secure movement of hazardous materials to industry and consumers by all transportation modes, incl...
'357' => [ 'US, Alcohol and Tobacco Tax and Trade Bureau (TTB)',

 view all matches for this distribution


Business-KontoCheck

 view release on metacpan or  search on metacpan

zlib/adler32.c  view on Meta::CPAN


    /* for negative len, return invalid adler32 as a clue for debugging */
    if (len2 < 0)
        return 0xffffffffUL;

    /* the derivation of this formula is left as an exercise for the reader */
    MOD63(len2);                /* assumes len2 >= 0 */
    rem = (unsigned)len2;
    sum1 = adler1 & 0xffff;
    sum2 = rem * sum1;
    MOD(sum2);

 view all matches for this distribution


Business-RO-TaxDeduction

 view release on metacpan or  search on metacpan

lib/Business/RO/TaxDeduction.pm  view on Meta::CPAN

    my $amount = $self->deduction->amount;
    if ( $vbl <= $self->vbl_min ) {
        return $amount;
    }
    elsif ( ( $vbl > $self->vbl_min ) && ( $vbl <= $self->vbl_max ) ) {
        $amount = $self->_tax_deduction_formula($vbl, $amount);
        return ( blessed $amount ) ? $amount->bstr : $amount;
    }
    else {
        return 0;               # 0 for VBL > vbl_max
    }
}

sub _tax_deduction_formula {
    my ( $self, $vbl, $base_deduction ) = @_;
    my $amount = $base_deduction * ( 1 - ( $vbl - $self->f_min ) / $self->f_max );
    return $self->_round_to_tens($amount);
}

lib/Business/RO/TaxDeduction.pm  view on Meta::CPAN

Return the deduction calculated for the given amount.

Starting with the current version (0.004) the appropriate algorithm
for the tax deduction calculation year is chosen.

=head3 _tax_deduction_formula

Formula for calculating the tax deduction for amounts above C<vbl_min>
and less or equal to C<vbl_max>.

=head3 _round_to_int

 view all matches for this distribution


Business-US_Amort

 view release on metacpan or  search on metacpan

lib/Business/US_Amort.pm  view on Meta::CPAN

surface as tiny discrepancies in loan calculations -- "tiny" as in
less than $1 for even multi-million-dollar loans amortized over
decades.

* Moreover, oddities may creep in because of round-off errors. This
seems to result from the fact that the formula that takes term,
interest rate, and principal, and returns the monthly payment, doesn't
know that a real-world monthly payment of "$1020.309" is impossible --
and so that ninth of a cent difference can add up across the months.
At worst, this may cause a 30-year-loan loan coming to term in 30
years and 1 month, with the last payment being needed to pay off a

 view all matches for this distribution


Business-cXML

 view release on metacpan or  search on metacpan

t/xml-catalog/cXML-1.2.036/cXML.dtd  view on Meta::CPAN

        This value is auto calculated when aboveTolerance or belowTolerance are send.
        If the supplier does not enter those attributes, "nonconformance" attribute could be send.
    deviation
        The deviation value.
    variance
        This will be used when we have valuation based on formula.
    numberOfDefects
        Number of the defects in this valuation.
    serialNumber
        Single unit number for the Unit to Be Inspected.
    inspectionDate

 view all matches for this distribution


C-Blocks

 view release on metacpan or  search on metacpan

examples/prima-ellipse.pl  view on Meta::CPAN

		my $rotation = atan2($y - 250, $x - 250);
		cblock {
			Handle widget_handle = gimme_the_mate($self);
			/* Draw an ellipse tilted toward the mouse. Thanks to
			 * http://www.uwgb.edu/dutchs/Geometry/HTMLCanvas/ObliqueEllipses5.HTM
			 * for the formula. */
			int i;
			double theta, theta_inc, theta_0, sin_theta_0, cos_theta_0;
			
			/* get the rotation, set the per-step theta increment */
			theta_0 = SvNV($rotation);

 view all matches for this distribution


C-Include

 view release on metacpan or  search on metacpan

Include/test.h  view on Meta::CPAN


/* To directly access the 'Nodes' and/or 'Areas' while bypassing the */
/* Extensions, perform an absolute (from beginning of file) seek to  */
/*                   sizeof(CONFIG) + CONFIG.offset                  */
/* If you want to access the 'Areas', you have to add the following  */
/* value to the above formula:  CONFIG.NodeCnt * CONFIG.NodeRecSize  */

typedef struct
{
 Address addr;                  /* Main address                          */
 Address arcdest;               /* ARCmail fileattach address            */

 view all matches for this distribution


C-TinyCompiler

 view release on metacpan or  search on metacpan

lib/C/TinyCompiler.pm  view on Meta::CPAN

 $context->code('Body') .= "\n#line " . (__LINE__+1) . ' "' . __FILE__ . q{"
     ... code goes here ...
 };

and then your error reporting would say where the error occurred with respect to
the line in your script. That formula is long-winded and error prone, so you can
use this useful bit of shorthand instead:

 $context->code('Body') .= C::TinyCompiler::line_number(__LINE__) . q{
     ... code goes here ...
 };

 view all matches for this distribution


CAM-PDF

 view release on metacpan or  search on metacpan

lib/CAM/PDF.pm  view on Meta::CPAN


            $da =~ s/ \/$fontname\s+0\s+Tf\b /\/$fontname $fontsize Tf/gxms;
         }
         if ($fontsize)
         {
            # This formula is TOTALLY empirical.  It's probably wrong.
            $ty = $border + 2 + (9 - $fontsize) * 0.4;
         }


         # escape characters

 view all matches for this distribution


CAM-PDFTaxforms

 view release on metacpan or  search on metacpan

lib/CAM/PDFTaxforms.pm  view on Meta::CPAN

            $fontsize *= $maxwidth / $fontwidth  if ($fontwidth > $maxwidth);
            $da =~ s/ \/$fontname\s+0\s+Tf\b /\/$fontname $fontsize Tf/gxms;
         }
         if ($fontsize)
         {
            # This formula is TOTALLY empirical.  It's probably wrong.
#           #JWT:CHGD. TO NEXT:  $ty = $border + 2 + (9 - $fontsize) * 0.4;
            $ty = $border + 2 + (5 - $fontsize) * 0.4;
         }


 view all matches for this distribution


CGI-Bus

 view release on metacpan or  search on metacpan

lib/CGI/Bus.pod  view on Meta::CPAN

L<CGI::Bus::tmsql|CGI/Bus/tmsql> changed: new 'thead' and 'tbody' HTML tags in C<cmdlst>.


=head2 08/11/2002

gwo.cgi changed: 'otime' field SQL formula changed from '..., gwo.utime)' to
'..., COALESCE(gwo.etime, gwo.utime)'.

gwo.cgi new: 'All News', 'Our News', 'Pers News' views.


 view all matches for this distribution


CGI-FormBuilder

 view release on metacpan or  search on metacpan

lib/CGI/FormBuilder/Messages/es.pm  view on Meta::CPAN

# First, create a hash of messages for this language
__PACKAGE__->define_messages({
    lang                  => 'es_ES',
    charset               => 'utf-8',

    js_invalid_start      => '%s error(es) fueron encontrados en su formulario:',
    js_invalid_end        => 'Por favor corrija en el/los campo(s) e intente de nuevo\n', 
    js_invalid_input      => 'Introduzca un valor válido para el campo: "%s"',
    js_invalid_select     => 'Escoja una opción de la lista: "%s"', 
    js_invalid_multiple   => '- Escoja una o más opciones de la lista: "%s"',
    js_invalid_checkbox   => '- Revise una o más de las opciones: "%s"',

 view all matches for this distribution


CGI-OptimalQuery

 view release on metacpan or  search on metacpan

lib/DBIx/OptimalQuery.pm  view on Meta::CPAN

  # look for new cursors and define parent child links if not already defined
  foreach my $join (keys %{ $oq->{'joins'} }) {
    my $opts = $oq->{'joins'}->{$join}->[3];
    if (exists $opts->{new_cursor}) {
      if (ref($opts->{new_cursor}) ne 'HASH') {
        $oq->_formulate_new_cursor($join);
      } else {
        die "could not find keys, join, and sql for new cursor in $join"
          unless exists $opts->{new_cursor}->{'keys'} &&
                 exists $opts->{new_cursor}->{'join'} &&
                 exists $opts->{new_cursor}->{'sql'};

lib/DBIx/OptimalQuery.pm  view on Meta::CPAN



# defines how a child cursor joins to its parent cursor
# by defining keys, join, sql in child cursor
# called from the _normalize method
sub _formulate_new_cursor {
  my $oq = shift;
  my $joinAlias = shift; 

  #$$oq{error_handler}->("DEBUG: \$oq->_formulate_new_cursor('$joinAlias')\n") if $$oq{debug};

  # vars to define
  my (@keys, $join, $sql, @sqlBinds);

  # get join definition

 view all matches for this distribution


CGI-WebToolkit

 view release on metacpan or  search on metacpan

t/private/javascripts/prototype.js  view on Meta::CPAN

      },
      'only-of-type':   function(m) {
        var p = Selector.xpath.pseudos; return p['first-of-type'](m) + p['last-of-type'](m);
      },
      nth: function(fragment, m) {
        var mm, formula = m[6], predicate;
        if (formula == 'even') formula = '2n+0';
        if (formula == 'odd')  formula = '2n+1';
        if (mm = formula.match(/^(\d+)$/)) // digit only
          return '[' + fragment + "= " + mm[1] + ']';
        if (mm = formula.match(/^(-?\d*)?n(([+-])(\d+))?/)) { // an+b
          if (mm[1] == "-") mm[1] = -1;
          var a = mm[1] ? Number(mm[1]) : 1;
          var b = mm[2] ? Number(mm[2]) : 0;
          predicate = "[((#{fragment} - #{b}) mod #{a} = 0) and " +
          "((#{fragment} - #{b}) div #{a} >= 0)]";

t/private/javascripts/prototype.js  view on Meta::CPAN

      for (var i = 0, results = [], node; node = nodes[i]; i++)
        if (!h.previousElementSibling(node) && !h.nextElementSibling(node))
          results.push(node);
      return results;
    },
    'nth-child':        function(nodes, formula, root) {
      return Selector.pseudos.nth(nodes, formula, root);
    },
    'nth-last-child':   function(nodes, formula, root) {
      return Selector.pseudos.nth(nodes, formula, root, true);
    },
    'nth-of-type':      function(nodes, formula, root) {
      return Selector.pseudos.nth(nodes, formula, root, false, true);
    },
    'nth-last-of-type': function(nodes, formula, root) {
      return Selector.pseudos.nth(nodes, formula, root, true, true);
    },
    'first-of-type':    function(nodes, formula, root) {
      return Selector.pseudos.nth(nodes, "1", root, false, true);
    },
    'last-of-type':     function(nodes, formula, root) {
      return Selector.pseudos.nth(nodes, "1", root, true, true);
    },
    'only-of-type':     function(nodes, formula, root) {
      var p = Selector.pseudos;
      return p['last-of-type'](p['first-of-type'](nodes, formula, root), formula, root);
    },

    getIndices: function(a, b, total) {
      if (a == 0) return b > 0 ? [b] : [];
      return $R(1, total).inject([], function(memo, i) {
        if (0 == (i - b) % a && (i - b) / a >= 0) memo.push(i);
        return memo;
      });
    },

    nth: function(nodes, formula, root, reverse, ofType) {
      if (nodes.length == 0) return [];
      if (formula == 'even') formula = '2n+0';
      if (formula == 'odd')  formula = '2n+1';
      var h = Selector.handlers, results = [], indexed = [], m;
      h.mark(nodes);
      for (var i = 0, node; node = nodes[i]; i++) {
        if (!node.parentNode._countedByPrototype) {
          h.index(node.parentNode, reverse, ofType);
          indexed.push(node.parentNode);
        }
      }
      if (formula.match(/^\d+$/)) { // just a number
        formula = Number(formula);
        for (var i = 0, node; node = nodes[i]; i++)
          if (node.nodeIndex == formula) results.push(node);
      } else if (m = formula.match(/^(-?\d*)?n(([+-])(\d+))?/)) { // an+b
        if (m[1] == "-") m[1] = -1;
        var a = m[1] ? Number(m[1]) : 1;
        var b = m[2] ? Number(m[2]) : 0;
        var indices = Selector.pseudos.getIndices(a, b, nodes.length);
        for (var i = 0, node, l = indices.length; node = nodes[i]; i++) {

 view all matches for this distribution


CIPP

 view release on metacpan or  search on metacpan

lib/CIPP/Manual.pm  view on Meta::CPAN


Creation of a CIPP object URL

=item <?HIDDENFIELDS>

Producing a number of hidden formular fields

=item <?HTMLQUOTE>

HTML encoding of a variable

lib/CIPP/Manual.pm  view on Meta::CPAN

Interface

=head2 Syntax

 <?FETCHUPLOAD FILENAME=server_side_filename
               VAR=upload_formular_variable
             [ THROW=exception ] >

=head2 Description

This command fetches a file which was uploaded by a client and saves it in the webservers filesystem. It replaces the deprecated CIPP 2.x command <?SAVEFILE> and has a cleaner interface.

lib/CIPP/Manual.pm  view on Meta::CPAN

Interface

=head2 Syntax

 <?SAVEFILE FILENAME=server_side_filename
            VAR=upload_formular_variable
            [ SYMBOLIC ]
            [ THROW=exception ] >

=head2 Description

lib/CIPP/Manual.pm  view on Meta::CPAN


=over 8

=item B<NAME>

The name of the formular widget.

=item B<MULTIPLE>

If this is set, a multi selection list will be generated, instead of a single selection popup widget.

 view all matches for this distribution


CLI-LaTeX-Table

 view release on metacpan or  search on metacpan

scripts/latextable  view on Meta::CPAN

    s/(?<=[0-9a-f]{$hlen})[0-9a-f]+/../gi if defined $o{H} ; # <-- - (?<= ) で正規表現の後読み

    # ドル$文字関連 The pre-processing of the character "$ dollar". The completion process will appear much later.
    s|\G(.*?)\$|$1=\$\$=|g ; # ドル文字の前処理。\Gは文字列の先頭、もしくは修飾子 g がついたパターンマッチングが終了した場所を記憶しておき、そこにマッチ

    # LaTeX中で 数式環境を利用するもの Utilization of math formula env. of LaTeX for some specific characters such as \~!<>.
    s/([\\\Q!~<>|"\E\x{FF0D}]+)/\$$1\$/g ; # 1. 数式環境に移行して、    ;  \Qと\Eの間はパターンメタ文字の無効化。 
    s/\\/\\backslash/g ;        # 2. そして、まず先にバックスラッシュに処理をして、後の処理が続く。
    s/~/\\sim/g;                # チルダ
    s/\x{FF0D}/\Q\!\!\frac{}{{{}\atop{H}}}\!\!\E/g if $o{'_'} ;   # 全角ハイフンはその下に、H を小さく書く ; \N{FULLWIDTH HYPHEN-MINUS}
    s/\ /\\scalebox{0.5}[0.5]{\$\\sqcup\$}/g if $o{'_'} ; # 半角スペースの強調  ; 

 view all matches for this distribution


CLI-Popt

 view release on metacpan or  search on metacpan

easyxs/README.md  view on Meta::CPAN

detail.

EasyXS defines an `exs_sv_type` macro that takes an SV as argument
and returns a member of `enum exs_sv_type_e` (typedef’d as just
`exs_sv_type_e`; see `easyxs_scalar.h` for values). The logic is compatible
with the serialization logic formulated during Perl 5.36’s development cycle.

## SV/Number Conversion

### `UV* exs_SvUV(SV* sv)`

 view all matches for this distribution


CNC-Cog

 view release on metacpan or  search on metacpan

Cog.pm  view on Meta::CPAN

    # 
    # x^2+y^2=(b+r)^2
    # y=mx+j
    # x^2+m^2x^2+2mxj+j^2=(b+r)^2
    # (1+m^2) x^2 + 2mj x +j^2-(b+r)^2=0 
    # use quadratic equation formula to find x: 
    # x=(-b+- sqrt(b^2-4ac)/2a
    #
    # x=(-2mj +- sqrt(4m^2j^2-4(1+m^2)(j^2-(b+r)^2)))/2(1+m^2)
    # This is the center point of the arc. 

 view all matches for this distribution


CPAN-Search-Lite

 view release on metacpan or  search on metacpan

lib/CPAN/Search/Lite/Lang/es.pm  view on Meta::CPAN

           custom => 'URL personal',
           default => 'El enlace por defecto de',
           alt => 'o',
          install => 'Instale',
           mirror1 => << 'END',
Con este formulario usted puede especificar de d&oacute;nde desea 
realizar las descargas (esto requiere que las 
cookies est&eacute;n permitidas). 
Su configuraci&oacute;n actual es 
END
           mirror2 => << 'END',

 view all matches for this distribution


CPP-Boost-Mini

 view release on metacpan or  search on metacpan

include/boost/config/auto_link.hpp  view on Meta::CPAN

Algorithm:
~~~~~~~~~~

Libraries for Borland and Microsoft compilers are automatically
selected here, the name of the lib is selected according to the following
formula:

BOOST_LIB_PREFIX
   + BOOST_LIB_NAME
   + "_"
   + BOOST_LIB_TOOLSET

 view all matches for this distribution


CPP-catch-test

 view release on metacpan or  search on metacpan

src/catch.hpp  view on Meta::CPAN

        explicit Approx( T value ): Approx(static_cast<double>(value))
        {}

        template <typename T, typename = typename std::enable_if<std::is_constructible<double, T>::value>::type>
        friend bool operator == ( const T& lhs, Approx const& rhs ) {
            // Thanks to Richard Harris for his help refining this formula
            auto lhs_v = double(lhs);
            bool relativeOK = std::fabs(lhs_v - rhs.m_value) < rhs.m_epsilon * (rhs.m_scale + (std::max)(std::fabs(lhs_v), std::fabs(rhs.m_value)));
            if (relativeOK) {
                return true;
            }

src/catch.hpp  view on Meta::CPAN

            approx.scale( m_scale );
            return approx;
        }

        friend bool operator == ( double lhs, Approx const& rhs ) {
            // Thanks to Richard Harris for his help refining this formula
            bool relativeOK = std::fabs( lhs - rhs.m_value ) < rhs.m_epsilon * (rhs.m_scale + (std::max)( std::fabs(lhs), std::fabs(rhs.m_value) ) );
            if (relativeOK) {
                return true;
            }
            return std::fabs(lhs - rhs.m_value) < rhs.m_margin;

 view all matches for this distribution


CPU-Z80-Disassembler

 view release on metacpan or  search on metacpan

t/data/zx48.asm  view on Meta::CPAN

;   as a tangent, taking the radius as its distance from the centre.
;
;   Both the CIRCLE algorithm and the ARC drawing algorithm make use of the
;   'ROTATION FORMULA' (see later).  It is only necessary to work out where 
;   the first line will be drawn and how long it is and then the rotation 
;   formula takes over and calculates all other rotated points.
;
;   All Spectrum circles consist of two vertical lines at each side and two 
;   horizontal lines at the top and bottom. The number of lines is calculated
;   from the radius of the circle and is always divisible by 4. For complete 
;   circles it will range from 4 for a square circle to 32 for a circle of 

t/data/zx48.asm  view on Meta::CPAN


        DEFB    $E2             ;;get-mem-2     x, y, yy, xx.

;   Once we get the coordinates of the first straight line then the 'ROTATION
;   FORMULA' used in the arc loop will take care of all other points, but we
;   now use a variation of that formula to rotate the first arc through (A-a)/2
;   radians. 
;   
;       xRotated = y * sin(angle) + x * cos(angle)
;       yRotated = y * cos(angle) - x * sin(angle)
;

t/data/zx48.asm  view on Meta::CPAN

;   for the duration of the routine.
;   Memory location mem-1 holds the last relative x value (rx) and mem-2 holds
;   the last relative y value (ry) used by DRAW.
;
;   Note. that this is a very clever twist on what is after all a very clever,
;   well-used formula.  Normally the rotation formula is used with the x and y
;   coordinates from the centre of the circle (or arc) and a supplied angle to 
;   produce two new x and y coordinates in an anticlockwise direction on the 
;   circumference of the circle.
;   What is being used here, instead, is the relative X and Y parameters from
;   the last point plotted that are required to get to the current point and 
;   the formula returns the next relative coordinates to use. 

;; ARC-LOOP
L2425:  RST     28H             ;; FP-CALC      
        DEFB    $E1             ;;get-mem-1     rx.
        DEFB    $31             ;;duplicate     rx, rx.

t/data/zx48.asm  view on Meta::CPAN

        RET                     ; Return.

; --------------------------
; THE 'DOUBLE ANGLE FORMULA'
; --------------------------
;   This formula forms cos(a) from sin(a/2) using simple arithmetic.
;
;   THE GEOMETRIC PROOF OF FORMULA   cos (a) = 1 - 2 * sin(a/2) * sin(a/2)
;                                                                    
;                                                                   
;                                            A                     

t/data/zx48.asm  view on Meta::CPAN

;   factor of 65536: hence w^{32768*r} = 1 (mod p), so 65536 divides 32768*r,
;   and hence r is even and d is a square (mod p). Conversely, the squares in
;   Fp* form a subgroup of (Fp*)^2 of index 2, and so cannot be generators.
;
;   Hence to check whether 75 is primitive mod 65537, we want to calculate that
;   (75/65537) = -1. There is a multiplicative formula (ab/p) = (a/p)(b/p) (mod
;   p), so (75/65537) = (5/65537)^2 * (3/65537) = (3/65537). Now the law of
;   quadratic reciprocity says that if p and q are distinct odd primes, then
;
;    (p/q)(q/p) = (-1)^{(p-1)(q-1)/4}
;

t/data/zx48.asm  view on Meta::CPAN

; ---------------------
; (Offset $22: 'asn')
;   The inverse sine function with result in radians.
;   Derived from arctan function above.
;   Error A unless the argument is between -1 and +1 inclusive.
;   Uses an adaptation of the formula asn(x) = atn(x/sqr(1-x*x))
;
;
;                 /|
;                / |
;              1/  |x

 view all matches for this distribution


CVSS

 view release on metacpan or  search on metacpan

lib/CVSS/v3.pm  view on Meta::CPAN

    $self->metrics->{MA}  //= 'X';


    # Base Metrics Equations

    # The Base Score formula depends on sub-formulas for Impact Sub-Score (ISS),
    # Impact, and Exploitability, all of which are defined below:

    # ISS = 1 - [ (1 - Confidentiality) × (1 - Integrity) × (1 - Availability) ]

    # Impact =

lib/CVSS/v3.pm  view on Meta::CPAN


    if ($self->metric_group_is_set('environmental')) {

        # Environmental Metrics Equations

        # The Environmental Score formula depends on sub-formulas for Modified Impact
        # Sub-Score (MISS), ModifiedImpact, and ModifiedExploitability, all of which
        # are defined below:

        # MISS =  Minimum ( 1 - [
        #   (1 - ConfidentialityRequirement × ModifiedConfidentiality) ×

 view all matches for this distribution


CWB

 view release on metacpan or  search on metacpan

lib/CWB/CEQL/Parser.pm  view on Meta::CPAN

=head2 The shift-reduce parser for nested bracketing

The B<Apply> method is more than a convenient shorthand for parsing lists of
constituents.  Its main purpose is to parse nested bracketing structures,
which are very common in the syntax of formal languages (examples include
arithmetical formulae, regular expressions and most computer programming
languages).  When parsing the constituents of a list with nested bracketing,
two special methods, B<BeginGroup> and B<EndGroup>, are called to mark opening
and closing delimiters.  Proper nesting will then automatically be verified by
the DPP parser.  If the syntax allows different types of groups to be mixed,
optional names can be passed to the B<BeginGroup> and B<EndGroup> calls in

 view all matches for this distribution


CallBackery

 view release on metacpan or  search on metacpan

lib/CallBackery/qooxdoo/callbackery/source/translation/fr.po  view on Meta::CPAN

msgstr ""

#: callbackery/ui/TabView.js:47
msgid "This form contains unsaved data. Do you still want to switch?"
msgstr ""
"Ce formulaire contient des données non sauvegardées. Voulez-vous toujours "
"changer?"

#: callbackery/ui/form/Auto.js:78 callbackery/ui/form/Auto.js:86
msgid "dd.MM.yyyy"
msgstr ""

 view all matches for this distribution


Cartography-Projection-GCTP

 view release on metacpan or  search on metacpan

gctpc/robfor.c  view on Meta::CPAN

  -----------------*/
dlon = adjust_lon(lon - lon_center);
p2 = fabs(lat / 5.0 / .01745329252);
ip1 = (long) (p2 - EPSLN);

/* Stirling's interpolation formula (using 2nd Diff.)
---------------------------------------------------*/
p2 -= (double) ip1;
*x = R * (xlr[ip1 + 2] + p2 * (xlr[ip1 + 3] - xlr[ip1 + 1]) / 2.0 +
          p2 * p2 * (xlr[ip1 + 3] - 2.0 * xlr[ip1 + 2] + xlr[ip1 + 1])/2.0) * 
          dlon + false_easting;

 view all matches for this distribution


Catalyst-View-Spreadsheet-Template

 view release on metacpan or  search on metacpan

t/basic.t  view on Meta::CPAN

    is($font->{Color}, '#000000');
}

{
    my $cell = $ws->get_cell(5, 1);
    is($cell->unformatted, "<< formula cell");
    is($cell->value, "<< formula cell");
    is($cell->type, 'Text');
    is($cell->{Formula}, undef);

    my $format = $cell->get_format;
    is($format->{AlignH}, 3);

 view all matches for this distribution


( run in 0.521 second using v1.01-cache-2.11-cpan-3cd7ad12f66 )