Result:
found 145 distributions and 275 files matching your query ! ( run in 0.719 )


Org-Parser

 view release on metacpan or  search on metacpan

Changes  view on Meta::CPAN

	  an element is a 'blocky' element or an 'inline' element.


0.52    2016-11-06  Released-By: PERLANCAR

	- Use $] >= ... instead of $] ge ... to avoid test failures on
	  FreeBSD on 5.20.x perls [suggested by Slaven Rezic, RT#118647].


0.51    2016-11-06  Released-By: PERLANCAR

 view all matches for this distribution


PAR-Packer

 view release on metacpan or  search on metacpan

lib/PAR/Packer.pm  view on Meta::CPAN

            $self->_name2moddata($name, \@modules, \@data);
        }
    }

    if ($opt->{u}) {
        if ($] lt '5.031006') {
            push @modules, "utf8_heavy.pl";
        }
        else {
            $self->_warn("'-u' is not needed for Perl >= 5.31.6");
        }

 view all matches for this distribution


PPIx-QuoteLike

 view release on metacpan or  search on metacpan

lib/PPIx/QuoteLike/Constant.pm  view on Meta::CPAN

use constant LOCATION_LOGICAL_FILE => 4;
## VERBATIM END

use constant MINIMUM_PERL	=> '5.000';

use constant SUFFICIENT_UTF8_SUPPORT_FOR_WEIRD_DELIMITERS => $] ge '5.008003';

# Match the name of a variable. The user of this needs to anchor it
# right after the sigil. The line noise is [[:punct:]] as documented in
# perlrecharclass, less anything that needs to be excluded (currently
# only '@' and '*').

 view all matches for this distribution


PPIx-Regexp

 view release on metacpan or  search on metacpan

lib/PPIx/Regexp/Constant.pm  view on Meta::CPAN


use constant RE_CAPTURE_NAME => ' [_[:alpha:]] \w* ';

use constant STRUCTURE_UNKNOWN	=> 'PPIx::Regexp::Structure::Unknown';

use constant SUFFICIENT_UTF8_SUPPORT_FOR_WEIRD_DELIMITERS => $] ge '5.008003';

use constant TOKEN_LITERAL	=> 'PPIx::Regexp::Token::Literal';
use constant TOKEN_UNKNOWN	=> 'PPIx::Regexp::Token::Unknown';

use constant VARIABLE_LENGTH_LOOK_BEHIND_INTRODUCED	=> '5.029009';

 view all matches for this distribution


Path-Iterator-Rule

 view release on metacpan or  search on metacpan

lib/Path/Iterator/Rule.pm  view on Meta::CPAN

our $VERSION = '1.015';

# Register warnings category
use warnings::register;

use if $] ge '5.010000', 're', 'regexp_pattern';

# Dependencies
use Carp           ();
use File::Basename ();
use File::Spec     ();

lib/Path/Iterator/Rule.pm  view on Meta::CPAN

    return qr/$new_flags$pattern/;
}

sub _split_re {
    my $value = shift;
    if ( $] ge 5.010 ) {
        return re::regexp_pattern($value);
    }
    else {
        $value =~ s/^\(\?\^?//;
        $value =~ s/\)$//;

 view all matches for this distribution


Perl-Dist-Strawberry

 view release on metacpan or  search on metacpan

share/utils/cpanm  view on Meta::CPAN

      )+)(.*)
    $/xs or return ($file,undef,undef);if ($dist =~ /-undef\z/ and!length$version){$dist =~ s/-undef\z//}$version =~ s/-withoutworldwriteables$//;if ($version =~ /^(-[Vv].*)-(\d.*)/){$dist .= $1;$version=$2}if ($version =~ /(.+_.*)-(\d.*)/){$dist .= ...
CPAN_DISTNAMEINFO

$fatpacked{"CPAN/Meta.pm"} = '#line '.(1+__LINE__).' "'.__FILE__."\"\n".<<'CPAN_META';
  use 5.006;use strict;use warnings;package CPAN::Meta;our$VERSION='2.150005';use Carp qw(carp croak);use CPAN::Meta::Feature;use CPAN::Meta::Prereqs;use CPAN::Meta::Converter;use CPAN::Meta::Validator;use Parse::CPAN::Meta 1.4414 ();BEGIN {*_dclone=...
CPAN_META

$fatpacked{"CPAN/Meta/Check.pm"} = '#line '.(1+__LINE__).' "'.__FILE__."\"\n".<<'CPAN_META_CHECK';
  package CPAN::Meta::Check;$CPAN::Meta::Check::VERSION='0.018';use strict;use warnings;use base 'Exporter';our@EXPORT=qw//;our@EXPORT_OK=qw/check_requirements requirements_for verify_dependencies/;our%EXPORT_TAGS=(all=>[@EXPORT,@EXPORT_OK ]);use CPA...
CPAN_META_CHECK

share/utils/cpanm  view on Meta::CPAN

$fatpacked{"File/pushd.pm"} = '#line '.(1+__LINE__).' "'.__FILE__."\"\n".<<'FILE_PUSHD';
  use strict;use warnings;package File::pushd;our$VERSION='1.009';our@EXPORT=qw(pushd tempd);our@ISA=qw(Exporter);use Exporter;use Carp;use Cwd qw(getcwd abs_path);use File::Path qw(rmtree);use File::Temp qw();use File::Spec;use overload q{""}=>sub {...
FILE_PUSHD

$fatpacked{"HTTP/Tiny.pm"} = '#line '.(1+__LINE__).' "'.__FILE__."\"\n".<<'HTTP_TINY';
  package HTTP::Tiny;use strict;use warnings;our$VERSION='0.056';use Carp ();my@attributes;BEGIN {@attributes=qw(cookie_jar default_headers http_proxy https_proxy keep_alive local_address max_redirect max_size proxy no_proxy timeout SSL_options verif...
      sub $sub_name {
          my (\$self, \$url, \$args) = \@_;
          \@_ == 2 || (\@_ == 3 && ref \$args eq 'HASH')
          or Carp::croak(q/Usage: \$http->$sub_name(URL, [HASHREF])/ . "\n");
          return \$self->request('$req_method', \$url, \$args || {});

 view all matches for this distribution


Perlito5

 view release on metacpan or  search on metacpan

lib/Perlito5X/Test2/API.pm  view on Meta::CPAN

    INIT { eval 'END { test2_set_is_end() }; 1' or die $@ }
}

BEGIN {
    no warnings 'once';
    if($] ge '5.014' || $ENV{T2_CHECK_DEPTH} || $Test2::API::DO_DEPTH_CHECK) {
        *DO_DEPTH_CHECK = sub() { 1 };
    }
    else {
        *DO_DEPTH_CHECK = sub() { 0 };
    }

 view all matches for this distribution


Pinto

 view release on metacpan or  search on metacpan

etc/cpanm  view on Meta::CPAN

      )+)(.*)
    $/xs or return ($file,undef,undef);if ($dist =~ /-undef\z/ and!length$version){$dist =~ s/-undef\z//}$version =~ s/-withoutworldwriteables$//;if ($version =~ /^(-[Vv].*)-(\d.*)/){$dist .= $1;$version=$2}if ($version =~ /(.+_.*)-(\d.*)/){$dist .= ...
CPAN_DISTNAMEINFO

$fatpacked{"CPAN/Meta.pm"} = <<'CPAN_META';
  use 5.006;use strict;use warnings;package CPAN::Meta;our$VERSION='2.132510';use Carp qw(carp croak);use CPAN::Meta::Feature;use CPAN::Meta::Prereqs;use CPAN::Meta::Converter;use CPAN::Meta::Validator;use Parse::CPAN::Meta 1.4403 ();BEGIN {*_dclone=...
CPAN_META

$fatpacked{"CPAN/Meta/Check.pm"} = <<'CPAN_META_CHECK';
  package CPAN::Meta::Check;{$CPAN::Meta::Check::VERSION='0.007'}use strict;use warnings;use Exporter 5.57 'import';our@EXPORT=qw//;our@EXPORT_OK=qw/check_requirements requirements_for verify_dependencies/;our%EXPORT_TAGS=(all=>[@EXPORT,@EXPORT_OK ])...
CPAN_META_CHECK

etc/cpanm  view on Meta::CPAN

$fatpacked{"File/pushd.pm"} = <<'FILE_PUSHD';
  use strict;use warnings;package File::pushd;our$VERSION='1.005';our@EXPORT=qw(pushd tempd);our@ISA=qw(Exporter);use Exporter;use Carp;use Cwd qw(getcwd abs_path);use File::Path qw(rmtree);use File::Temp qw();use File::Spec;use overload q{""}=>sub {...
FILE_PUSHD

$fatpacked{"HTTP/Tiny.pm"} = <<'HTTP_TINY';
  package HTTP::Tiny;use strict;use warnings;our$VERSION='0.034';use Carp ();my@attributes;BEGIN {@attributes=qw(cookie_jar default_headers local_address max_redirect max_size proxy no_proxy timeout SSL_options verify_SSL);no strict 'refs';for my$acc...
      sub $sub_name {
          my (\$self, \$url, \$args) = \@_;
          \@_ == 2 || (\@_ == 3 && ref \$args eq 'HASH')
          or Carp::croak(q/Usage: \$http->$sub_name(URL, [HASHREF])/ . "\n");
          return \$self->request('$req_method', \$url, \$args || {});

etc/cpanm  view on Meta::CPAN

  package charstar;use overload ('""'=>\&thischar,'0+'=>\&thischar,'++'=>\&increment,'--'=>\&decrement,'+'=>\&plus,'-'=>\&minus,'*'=>\&multiply,'cmp'=>\&cmp,'<=>'=>\&spaceship,'bool'=>\&thischar,'='=>\&clone,);sub new {my ($self,$string)=@_;my$class=...
  	package
  	warnings;
  	sub enabled {return $^W;}
  	1;
      '}my$VERSION_MAX=0x7FFFFFFF;use constant TRUE=>1;use constant FALSE=>0;sub isDIGIT {my ($char)=shift->thischar();return ($char =~ /\d/)}sub isALPHA {my ($char)=shift->thischar();return ($char =~ /[a-zA-Z]/)}sub isSPACE {my ($char)=shift->thisch...
VERSION_VPP

s/^  //mg for values %fatpacked;

unshift @INC, sub {

 view all matches for this distribution


Plack-App-MCCS

 view release on metacpan or  search on metacpan

local/lib/perl5/Eval/TypeTiny.pm  view on Meta::CPAN

	
	#<<<
	# uncoverable subroutine
	sub ALIAS_IMPLEMENTATION () {
		$implementation ||= _pick_alternative(
			if    => ( $] ge '5.022' ) => IMPLEMENTATION_NATIVE,
			needs => 'Devel::LexAlias' => IMPLEMENTATION_DEVEL_LEXALIAS,
			needs => 'PadWalker'       => IMPLEMENTATION_PADWALKER,
			if    => !!1               => IMPLEMENTATION_TIE,
		);
	}

 view all matches for this distribution


Pod-2-DocBook

 view release on metacpan or  search on metacpan

doc/Pod-2-DocBook.pdf  view on Meta::CPAN

endobj
100 0 obj
<< /Length 2921 /Filter [ /ASCII85Decode /FlateDecode ]
 >>
stream
Gatm=D/\/g')nJ0@4\WRMQ:;]ZM]k[Ju!7pgKr;$)Xd]RQNKk'[&$5-[A&nPrG]OML?-Dq.T3i</Gt4nL`?n[%qgXhX6%1]D)Cb&hKZ9[*/k-W"+N"ZT0MfI"jY!#)b5h&E]<df;4ZV*i\#^8(^?-!GSH(lNob$aI/Qn`>)?7fSY\?UdZ6*E5D/(pp2#:uB1p?7Rl$n8ASZBAS$[%Gid/C&:]mkQ+FJ$C2;i+JZ>I^@"MRV^Co0)WJsTU`...
endstream
endobj
101 0 obj
<< /Type /Page
/Parent 1 0 R

 view all matches for this distribution


SPVM-Cwd

 view release on metacpan or  search on metacpan

cpanm  view on Meta::CPAN

      )+)(.*)
    $/xs or return ($file,undef,undef);if ($dist =~ /-undef\z/ and!length$version){$dist =~ s/-undef\z//}$version =~ s/-withoutworldwriteables$//;if ($version =~ /^(-[Vv].*)-(\d.*)/){$dist .= $1;$version=$2}if ($version =~ /(.+_.*)-(\d.*)/){$dist .= ...
CPAN_DISTNAMEINFO

$fatpacked{"CPAN/Meta.pm"} = '#line '.(1+__LINE__).' "'.__FILE__."\"\n".<<'CPAN_META';
  use 5.006;use strict;use warnings;package CPAN::Meta;our$VERSION='2.150005';use Carp qw(carp croak);use CPAN::Meta::Feature;use CPAN::Meta::Prereqs;use CPAN::Meta::Converter;use CPAN::Meta::Validator;use Parse::CPAN::Meta 1.4414 ();BEGIN {*_dclone=...
CPAN_META

$fatpacked{"CPAN/Meta/Check.pm"} = '#line '.(1+__LINE__).' "'.__FILE__."\"\n".<<'CPAN_META_CHECK';
  package CPAN::Meta::Check;$CPAN::Meta::Check::VERSION='0.012';use strict;use warnings;use base 'Exporter';our@EXPORT=qw//;our@EXPORT_OK=qw/check_requirements requirements_for verify_dependencies/;our%EXPORT_TAGS=(all=>[@EXPORT,@EXPORT_OK ]);use CPA...
CPAN_META_CHECK

cpanm  view on Meta::CPAN

$fatpacked{"File/pushd.pm"} = '#line '.(1+__LINE__).' "'.__FILE__."\"\n".<<'FILE_PUSHD';
  use strict;use warnings;package File::pushd;our$VERSION='1.009';our@EXPORT=qw(pushd tempd);our@ISA=qw(Exporter);use Exporter;use Carp;use Cwd qw(getcwd abs_path);use File::Path qw(rmtree);use File::Temp qw();use File::Spec;use overload q{""}=>sub {...
FILE_PUSHD

$fatpacked{"HTTP/Tiny.pm"} = '#line '.(1+__LINE__).' "'.__FILE__."\"\n".<<'HTTP_TINY';
  package HTTP::Tiny;use strict;use warnings;our$VERSION='0.056';use Carp ();my@attributes;BEGIN {@attributes=qw(cookie_jar default_headers http_proxy https_proxy keep_alive local_address max_redirect max_size proxy no_proxy timeout SSL_options verif...
      sub $sub_name {
          my (\$self, \$url, \$args) = \@_;
          \@_ == 2 || (\@_ == 3 && ref \$args eq 'HASH')
          or Carp::croak(q/Usage: \$http->$sub_name(URL, [HASHREF])/ . "\n");
          return \$self->request('$req_method', \$url, \$args || {});

 view all matches for this distribution


SQL-Abstract-More

 view release on metacpan or  search on metacpan

lib/SQL/Abstract/More.pm  view on Meta::CPAN

  # syntax for assembling all elements
  my $syntax = $self->{join_syntax}{$join_spec->{operator}};

  my ($sql, @bind);

  { no if $] ge '5.022000', warnings => 'redundant';
    # because sprintf instructions  may _intentionally_ omit %.. parameters

    if ($join_spec->{using}) {
      not $join_spec->{condition}
        or puke "join specification has both {condition} and {using} fields";

 view all matches for this distribution


SVG-TT-Graph

 view release on metacpan or  search on metacpan

lib/SVG/TT/Graph/TimeSeries.pm  view on Meta::CPAN

  my $self = shift;

  # Need to set the timezone in order for x-axis labels to be 
  # formatted correctly by strftime:
  $ENV{'TZ'} = $self->{config}->{timescale_time_zone};
  POSIX::tzset() if ($] lt '5.008009');

  # run through the data and calculate maximum and minimum values
  my ($max_key_size,$max_time,$min_time,$max_value,$min_value,$max_x_label_length,$x_label);

  foreach my $dataset (@{$self->{data}}) {

 view all matches for this distribution


Search-Dict

 view release on metacpan or  search on metacpan

lib/Search/Dict.pm  view on Meta::CPAN

require Exporter;

my $fc_available;
BEGIN {
  $fc_available = '5.015008';
  if ( $] ge $fc_available ) {
    require feature;
    'feature'->import('fc'); # string avoids warning on old Perls <sigh>
  }
}

lib/Search/Dict.pm  view on Meta::CPAN

    $size = do { seek($fh,0,2); my $s = tell($fh); seek($fh,0,0); $s }
        unless defined $size;
    $blksize ||= 8192;
    $key =~ s/[^\w\s]//g if $dict;
    if ( $fold ) {
      $key = $] ge $fc_available ? fc($key) : lc($key);
    }
    # find the right block
    my($min, $max) = (0, int($size / $blksize));
    my $mid;
    while ($max - $min > 1) {

lib/Search/Dict.pm  view on Meta::CPAN

	$_ = <$fh>;
	$_ = $xfrm->($_) if defined $xfrm;
	chomp;
	s/[^\w\s]//g if $dict;
        if ( $fold ) {
          $_ = $] ge $fc_available ? fc($_) : lc($_);
        }
	if (defined($_) && $comp->($_, $key) < 0) {
	    $min = $mid;
	}
	else {

lib/Search/Dict.pm  view on Meta::CPAN

	    or last;
	$_ = $xfrm->($_) if defined $xfrm;
	chomp;
	s/[^\w\s]//g if $dict;
        if ( $fold ) {
          $_ = $] ge $fc_available ? fc($_) : lc($_);
        }
	last if $comp->($_, $key) >= 0;
    }
    seek($fh,$min,0);
    $min;

 view all matches for this distribution


Sort-HashKeys

 view release on metacpan or  search on metacpan

benchmark.pl  view on Meta::CPAN

use strict;
use warnings;
use Benchmark qw/cmpthese timethese/;
use Sort::HashKeys;
use constant HASH_SLICE => $] ge "5.020";

my (@perl, @expr, @slce, @xs, %hash, %hash1, %hash2, %hash3, %hash4);

my @chars = ("A".."Z", "a".."z", "0".."9");
for (1..1000) {

 view all matches for this distribution


Statistics-Distribution-Generator

 view release on metacpan or  search on metacpan

lib/Statistics/Distribution/Generator.pm  view on Meta::CPAN

package Statistics::Distribution::Generator;

use 5.010;

BEGIN {
  if ($] lt '5.012') {
    use strict;
    use warnings;
  }
}

 view all matches for this distribution


Storable-Improved

 view release on metacpan or  search on metacpan

t/utf8.t  view on Meta::CPAN

$x = join '', map {chr $_} (0..1023);
is($x, ${thaw freeze \$x});

# Char in the range 127-255 (probably) in utf8.  This just won't work for
# EBCDIC for early Perls.
$x = ($] lt 5.007_003) ? chr(175) : chr(utf8::unicode_to_native(175))
   . chr (256);
chop $x;
is($x, ${thaw freeze \$x});

# Storable needs to cope if a frozen string happens to be internal utf8

 view all matches for this distribution


Storable

 view release on metacpan or  search on metacpan

stacksize  view on Meta::CPAN

# configuration, but not in a very similar configuration.
$max_depth = int(0.6 * $max_depth);
$max_depth_hash = int(0.6 * $max_depth_hash);

my $stack_reserve = $^O eq "MSWin32" ? 32 : 16;
if ($] ge "5.016" && !($^O eq "cygwin" && $ptrsize == 8)) {
    $max_depth -= $stack_reserve;
    $max_depth_hash -= $stack_reserve;
}
else {
    # within the exception we need another stack depth to recursively

 view all matches for this distribution


Sub-Multi-Tiny

 view release on metacpan or  search on metacpan

lib/Sub/Multi/Tiny/Util.pm  view on Meta::CPAN

sub {
EOT

    # XXX DEBUG: Some extra output to try to debug failures on earlier Perls.
    $code .= _line_mark_string <<'EOT';
    if( $] lt '5.018' || $VERBOSE > 1) {
        require Data::Dumper;
        require Test::More;
        Test::More::diag(sprintf("Positional copier invocation %d:\n%s",
            ++$Sub::Multi::Tiny::Util::_positional_copier_invocation_number,
            Data::Dumper->Dump([\@_],['copier_args'])));

lib/Sub/Multi/Tiny/Util.pm  view on Meta::CPAN

                        "        $_" } @vars;

    $code .= _line_mark_string <<'EOT';
    ) = @_;

    if( $] lt '5.018' || $VERBOSE > 1) {
        Test::More::diag(sprintf("After positional copier invocation %d:",
            $Sub::Multi::Tiny::Util::_positional_copier_invocation_number));
        Test::More::diag(join "\n", map {
            sprintf("%s = %s", $_, eval($_))
        } @vars);

 view all matches for this distribution


TAP3-Tap3edit

 view release on metacpan or  search on metacpan

inc/Test2/API.pm  view on Meta::CPAN

    INIT { eval 'END { test2_set_is_end() }; 1' or die $@ }
}

BEGIN {
    no warnings 'once';
    if($] ge '5.014' || $ENV{T2_CHECK_DEPTH} || $Test2::API::DO_DEPTH_CHECK) {
        *DO_DEPTH_CHECK = sub() { 1 };
    }
    else {
        *DO_DEPTH_CHECK = sub() { 0 };
    }

 view all matches for this distribution


Test-BDD-Cucumber

 view release on metacpan or  search on metacpan

t/lib/Test/CucumberExtensionMetadataVerify.pm  view on Meta::CPAN

    croak 'pre_step called with incorrect number $step array elements'
        if scalar(@$step) != 3;

    croak 'pre_step called with incorrect first element type of $step array'
        # 5.10 reports SCALAR where the argument actually is a regexp; ignore <=5.10
        if reftype $step->[0] ne 'REGEXP' and $] ge '5.012';

    croak 'pre_step called with incorrect second element type of $step array'
        if reftype $step->[1] ne 'HASH';

    croak 'pre_step called with incorrect meta data content in $step array'

 view all matches for this distribution


Test-Mocha

 view release on metacpan or  search on metacpan

lib/Test/Mocha/Mock.pm  view on Meta::CPAN


use Test::Mocha::MethodCall;
use Test::Mocha::MethodStub;
use Test::Mocha::Util ();
use Types::Standard   ();
use if $] lt '5.025', 'UNIVERSAL::ref';

our $AUTOLOAD;

# Lookup table of classes for which mock isa() should return false
my %NOT_ISA =

 view all matches for this distribution


Test-ModuleVersion

 view release on metacpan or  search on metacpan

lib/Test/ModuleVersion.pm  view on Meta::CPAN

                  || $request->{headers}{'transfer-encoding'};
            $request->{cb} = $args->{content};
        }
        else {
            my $content = $args->{content};
            if ( $] ge '5.008' ) {
                utf8::downgrade($content, 1)
                    or die(qq/Wide character in request message body\n/);
            }
            $request->{headers}{'content-length'} = length $content
              unless $request->{headers}{'content-length'}

lib/Test/ModuleVersion.pm  view on Meta::CPAN

$escapes{' '}="+";
my $unsafe_char = qr/[^A-Za-z0-9\-\._~]/;

sub _uri_escape {
    my ($self, $str) = @_;
    if ( $] ge '5.008' ) {
        utf8::encode($str);
    }
    else {
        $str = pack("U*", unpack("C*", $str)) # UTF-8 encode a byte string
            if ( length $str == do { use bytes; length $str } );

lib/Test/ModuleVersion.pm  view on Meta::CPAN


sub write {
    @_ == 2 || die(q/Usage: $handle->write(buf)/ . "\n");
    my ($self, $buf) = @_;

    if ( $] ge '5.008' ) {
        utf8::downgrade($buf, 1)
            or die(qq/Wide character in write()\n/);
    }

    my $len = length $buf;

lib/Test/ModuleVersion.pm  view on Meta::CPAN

        my $data = $request->{cb}->();

        defined $data && length $data
          or last;

        if ( $] ge '5.008' ) {
            utf8::downgrade($data, 1)
                or die(qq/Wide character in write_content()\n/);
        }

        $len += $self->write($data);

lib/Test/ModuleVersion.pm  view on Meta::CPAN

        my $data = $request->{cb}->();

        defined $data && length $data
          or last;

        if ( $] ge '5.008' ) {
            utf8::downgrade($data, 1)
                or die(qq/Wide character in write_chunked_body()\n/);
        }

        $len += length $data;

 view all matches for this distribution


Test-Stream

 view release on metacpan or  search on metacpan

t/modules/Hub.t  view on Meta::CPAN

            $do_send->();
            exit 0;
        }
    }

    if (CAN_THREAD && $] ge '5.010') {
        require threads;
        my $thr = threads->new(sub { $do_send->() });
        $thr->join;
        $hub->cull();
        $do_check->('Threads');

 view all matches for this distribution


Test-TempDir-Tiny

 view release on metacpan or  search on metacpan

lib/Test/TempDir/Tiny.pm  view on Meta::CPAN


END {
    # only clean up in original process, not children
    if ( $$ == $ORIGINAL_PID ) {
        # our clean up must run after Test::More sets $? in its END block
        if ( $] lt "5.008000" ) {
            *Test::TempDir::Tiny::_CLEANER::DESTROY = \&_cleanup;
            *blob = bless( {}, 'Test::TempDir::Tiny::_CLEANER' );
        }
        else {
            require B;

 view all matches for this distribution


Test-Unit

 view release on metacpan or  search on metacpan

t/tlib/AssertTest.pm  view on Meta::CPAN

	my $actual = Test::Unit::Assert::is_numeric($str) ? 't' : 'f';
	$self->fail("For string '$str', expect $expect but got $actual")
	  unless $expect eq $actual;
    }

    if ($] gt '5.029001' && $] lt '5.031004') {
        # https://github.com/Perl/perl5/issues/17062
        # skipping test, broken around v5.30 because of bug in perl
    } else {
        my $actual = Test::Unit::Assert::is_numeric('0xF00') ? 't' : 'f';
        $self->fail("For string '0xF00', expect f but got $actual")

 view all matches for this distribution


Test2-Harness-UI

 view release on metacpan or  search on metacpan

t/HashBase.t  view on Meta::CPAN

    local $SIG{__WARN__} = sub { };
    *main::Const::Test::FOO = sub { 0 };
}
ok(!$pkg->FOO, "overrode const sub");
{
local $TODO = "known to fail on $]" if $] le "5.006002";
is($pkg->do_it, 'const', "worked as expected, const was constant");
}

BEGIN {
    $INC{'Object/HashBase/Test/HBase/Wrapped.pm'} = __FILE__;

 view all matches for this distribution


Test2-Tools-LoadModule

 view release on metacpan or  search on metacpan

inc/Test2/Plugin/INC_Jail.pm  view on Meta::CPAN


	    if ( $test_class eq $pkg ) {
		foreach my $dir ( @test_inc ) {
		    my $fh;
		    open $fh, '<', "$dir/$_[1]"
			and return $] ge '5.020' ? ( \'', $fh ) : $fh;
		}
		croak "Can't locate $_[1] in \@INC";
	    }

	    # The reason we have to iterate if the package is our

 view all matches for this distribution


( run in 0.719 second using v1.01-cache-2.11-cpan-b61123c0432 )